Nodes of different colours represent the following:
Solid arrows point from a parent (sub)module to the submodule which is descended from it. Dashed arrows point from a module being used to the module or program unit using it. 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.
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 InitSimpleMixingConvectiveHeatGains
! SUBROUTINE INFORMATION:
! AUTHOR Richard Liesen
! DATE WRITTEN February 1998
! MODIFIED March 2003, FCW: allow individual window/door venting control
! DATE MODIFIED April 2000
! May 2009, Brent Griffith added EMS override to mixing and cross mixing flows
! renamed routine and did some cleanup
! August 2011, Therese Stovall added refrigeration door mixing flows
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! This subroutine sets up the mixing and cross mixing flows
! METHODOLOGY EMPLOYED:
! na
! REFERENCES:
! na
! USE STATEMENTS:
USE ScheduleManager, ONLY: GetCurrentScheduleValue, GetScheduleIndex
USE General, ONLY: RoundSigDigits
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
! na
! SUBROUTINE PARAMETER DEFINITIONS:
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
INTEGER Loop ! local loop index
INTEGER NZ ! local index for zone number
INTEGER J ! local index for second zone in refrig door pair
! Zero out time step variables
MTC = 0.0d0
MVFC = 0.0d0
! Select type of airflow calculation
SELECT CASE (AirFlowFlag)
CASE(UseSimpleAirFlow) ! Simplified airflow calculation
! Process the scheduled Mixing for air heat balance
DO Loop=1,TotMixing
NZ=Mixing(Loop)%ZonePtr
Mixing(Loop)%DesiredAirFlowRate=Mixing(Loop)%DesignLevel * &
GetCurrentScheduleValue(Mixing(Loop)%SchedPtr)
IF (Mixing(Loop)%EMSSimpleMixingOn) Mixing(Loop)%DesiredAirFlowRate = Mixing(Loop)%EMSimpleMixingFlowRate
ENDDO
! Process the scheduled CrossMixing for air heat balance
DO Loop=1,TotCrossMixing
NZ=CrossMixing(Loop)%ZonePtr
CrossMixing(Loop)%DesiredAirFlowRate=CrossMixing(Loop)%DesignLevel * &
GetCurrentScheduleValue(CrossMixing(Loop)%SchedPtr)
IF (CrossMixing(Loop)%EMSSimpleMixingOn) CrossMixing(Loop)%DesiredAirFlowRate = CrossMixing(Loop)%EMSimpleMixingFlowRate
MTC(Loop)=CrossMixing(Loop)%DeltaTemperature
MVFC(Loop)=CrossMixing(Loop)%DesiredAirFlowRate
ENDDO
!Note - do each Pair a Single time, so must do increment reports for both zones
! Can't have a pair that has ZoneA zone number = NumofZones because organized
! in input with lowest zone # first no matter how input in idf
! Process the scheduled Refrigeration Door mixing for air heat balance
IF(TotRefDoorMixing .GT. 0) THEN
DO NZ=1,(NumOfZones - 1) ! Can't have %ZonePtr==NumOfZones because lesser zone # of pair placed in ZonePtr in input
IF(.NOT. RefDoorMixing(NZ)%RefDoorMixFlag)CYCLE
IF ((RefDoorMixing(NZ)%ZonePtr .EQ. NZ)) THEN
DO J = 1,RefDoorMixing(NZ)%NumRefDoorConnections
RefDoorMixing(NZ)%VolRefDoorFlowRate(J)=0.0d0
IF (RefDoorMixing(NZ)%EMSRefDoorMixingOn(J)) &
RefDoorMixing(NZ)%VolRefDoorFlowRate(J) = RefDoorMixing(NZ)%EMSRefDoorFlowRate(J)
END DO
END IF
ENDDO
END IF !TotRefDoorMixing
! Infiltration and ventilation calculations have been moved to a subroutine of CalcAirFlowSimple in HVAC Manager
CASE DEFAULT
END SELECT
RETURN
END SUBROUTINE InitSimpleMixingConvectiveHeatGains