Nodes of different colours represent the following:
Solid arrows point from a procedure to one which it calls. Dashed arrows point from an interface to procedures which implement that interface. This could include the module procedures in a generic interface or the implementation in a submodule of an interface in a parent module. Where possible, edges connecting nodes are given different colours to make them easier to distinguish in large graphs.
Nodes of different colours represent the following:
Solid arrows point from a procedure to one which it calls. Dashed arrows point from an interface to procedures which implement that interface. This could include the module procedures in a generic interface or the implementation in a submodule of an interface in a parent module. Where possible, edges connecting nodes are given different colours to make them easier to distinguish in large graphs.
SUBROUTINE UpdateOAPretreatSetPoints
          ! SUBROUTINE INFORMATION:
          !       AUTHOR         M. J. Witte based on UpdateMixedAirSetPoints by Fred Buhl,
          !                        Work supported by ASHRAE research project 1254-RP
          !       DATE WRITTEN   January 2005
          !       MODIFIED       na
          !       RE-ENGINEERED  na
          ! PURPOSE OF THIS SUBROUTINE
          ! Loop over all the Outside Air Pretreat Managers and use their output arrays
          ! to set the node setpoints.
          ! METHODOLOGY EMPLOYED:
          ! REFERENCES:
          ! na
          ! USE STATEMENTS:
    IMPLICIT NONE
          ! SUBROUTINE PARAMETER DEFINITIONS:
          ! na
          ! INTERFACE BLOCK SPECIFICATIONS
          ! na
          ! DERIVED TYPE DEFINITIONS
          ! na
          ! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
INTEGER :: SetPtMgrNum
INTEGER :: CtrlNodeIndex
INTEGER :: NodeNum
! Loop over all the Mixed Air Setpoint Managers
DO SetPtMgrNum=1,NumOAPretreatSetPtMgrs
  DO CtrlNodeIndex=1,OAPretreatSetPtMgr(SetPtMgrNum)%NumCtrlNodes ! Loop over the list of nodes wanting
                                                                ! setpoints from this setpoint manager
    NodeNum = OAPretreatSetPtMgr(SetPtMgrNum)%CtrlNodes(CtrlNodeIndex) ! Get the node number
    SELECT CASE(OAPretreatSetPtMgr(SetPtMgrNum)%CtrlTypeMode)
      CASE(iCtrlVarType_Temp)  ! 'Temperature'
        Node(NodeNum)%TempSetPoint = OAPretreatSetPtMgr(SetPtMgrNum)%SetPt ! Set the setpoint
      CASE(iCtrlVarType_MaxHumRat) ! 'MaximumHumidityRatio'
        Node(NodeNum)%HumRatMax = OAPretreatSetPtMgr(SetPtMgrNum)%SetPt ! Set the setpoint
      CASE(iCtrlVarType_MinHumRat) ! 'MinimumHumidityRatio'
        Node(NodeNum)%HumRatMin = OAPretreatSetPtMgr(SetPtMgrNum)%SetPt ! Set the setpoint
      CASE(iCtrlVarType_HumRat) ! 'HumidityRatio'
        Node(NodeNum)%HumRatSetPoint = OAPretreatSetPtMgr(SetPtMgrNum)%SetPt ! Set the setpoint
    END SELECT
  END DO
END DO
RETURN
END SUBROUTINE UpdateOAPretreatSetPoints