Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | GSHPNum |
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 UpdateGSHPRecords(GSHPNum)
! SUBROUTINE INFORMATION:
! AUTHOR: Arun
! DATE WRITTEN: October 1998
! PURPOSE OF THIS SUBROUTINE:
! reporting
! METHODOLOGY EMPLOYED: na
! REFERENCES: na
! USE STATEMENTS:
USE DataHVACGlobals, ONLY : TimeStepSys
IMPLICIT NONE
! SUBROUTINE ARGUMENT DEFINITIONS:
INTEGER, INTENT(IN) :: GSHPNum ! GSHP number
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! DERIVED TYPE DEFINITIONS
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
INTEGER :: SourceSideInletNode ! Source Side inlet node number, water side
INTEGER :: SourceSideOutletNode ! Source Side outlet node number, water side
INTEGER :: LoadSideInletNode ! Load Side inlet node number, water side
INTEGER :: LoadSideOutletNode ! Load Side outlet node number, water side
REAL(r64) :: ReportingConstant
LoadSideInletNode = GSHP(GSHPNum)%LoadSideInletNodeNum
LoadSideOutletNode = GSHP(GSHPNum)%LoadSideOutletNodeNum
SourceSideInletNode = GSHP(GSHPNum)%SourceSideInletNodeNum
SourceSideOutletNode = GSHP(GSHPNum)%SourceSideOutletNodeNum
IF (.NOT. GSHP(GSHPNum)%MustRun )THEN
!set node temperatures
Node(SourceSideOutletNode)%Temp = Node(SourceSideInletNode)%Temp
Node(LoadSideOutletNode)%Temp = Node(LoadSideInletNode)%Temp
GSHPReport(GSHPNum)%Power = 0.0d0
GSHPReport(GSHPNum)%Energy = 0.0d0
GSHPReport(GSHPNum)%QSource = 0.0d0
GSHPReport(GSHPNum)%QSourceEnergy = 0.0d0
GSHPReport(GSHPNum)%QLoad = 0.0d0
GSHPReport(GSHPNum)%QLoadEnergy = 0.0d0
GSHPReport(GSHPNum)%SourceSideWaterInletTemp = Node(SourceSideInletNode)%Temp
GSHPReport(GSHPNum)%SourceSideWaterOutletTemp = Node(SourceSideOutletNode)%Temp
GSHPReport(GSHPNum)%LoadSideWaterInletTemp = Node(LoadSideInletNode)%Temp
GSHPReport(GSHPNum)%LoadSideWaterOutletTemp = Node(LoadSideOutletNode)%Temp
GSHPReport(GSHPNum)%SourceSidemdot = SourceSideWaterMassFlowRate
GSHPReport(GSHPNum)%LoadSidemdot = LoadSideWaterMassFlowRate
ELSE
!set node temperatures
Node(LoadSideOutletNode)%Temp = LoadSideWaterOutletTemp
Node(SourceSideOutletNode)%Temp = SourceSideWaterOutletTemp
ReportingConstant = TimeStepSys*SecInHour
GSHPReport(GSHPNum)%Power = Power
GSHPReport(GSHPNum)%Energy = Power*ReportingConstant
GSHPReport(GSHPNum)%QSource = QSource
GSHPReport(GSHPNum)%QLoad = QLoad
GSHPReport(GSHPNum)%QSourceEnergy = QSource*ReportingConstant
GSHPReport(GSHPNum)%QLoadEnergy = QLoad*ReportingConstant
GSHPReport(GSHPNum)%LoadSideWaterInletTemp = Node(LoadSideInletNode)%Temp
GSHPReport(GSHPNum)%LoadSideWaterOutletTemp = Node(LoadSideOutletNode)%Temp
GSHPReport(GSHPNum)%SourceSideWaterInletTemp = Node(SourceSideInletNode)%Temp
GSHPReport(GSHPNum)%SourceSideWaterOutletTemp= Node(SourceSideOutletNode)%Temp
GSHPReport(GSHPNum)%SourceSidemdot = SourceSideWaterMassFlowRate
GSHPReport(GSHPNum)%LoadSidemdot = LoadSideWaterMassFlowRate
END IF
RETURN
END SUBROUTINE UpdateGSHPRecords