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.
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | WSHPNum | |||
logical, | intent(inout) | :: | ErrorsFound | |||
integer, | optional | :: | CompanionCoolingCoilNum | |||
integer, | optional | :: | CompanionHeatingCoilNum |
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 SetVarSpeedCoilData(WSHPNum,ErrorsFound,CompanionCoolingCoilNum,CompanionHeatingCoilNum)
! SUBROUTINE INFORMATION:
! AUTHOR Bo Shen, based on WatertoAirHeatPumpSimple:SetWSHPData
! DATE WRITTEN March 2012
! MODIFIED na
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! This routine was designed to "push" information from a parent object to
! this WSHP coil object.
! METHODOLOGY EMPLOYED:
! na
! REFERENCES:
! na
! USE STATEMENTS:
USE General, ONLY: TrimSigDigits
USE InputProcessor, ONLY: FindItemInList, SameString
USE FluidProperties, ONLY: FindGlycol
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
INTEGER, INTENT(IN) :: WSHPNum ! Number of OA Controller
LOGICAL, INTENT(INOUT) :: ErrorsFound ! Set to true if certain errors found
INTEGER, OPTIONAL :: CompanionCoolingCoilNum ! Index to cooling coil for heating coil = SimpleWSHPNum
INTEGER, OPTIONAL :: CompanionHeatingCoilNum ! Index to heating coil for cooling coil = SimpleWSHPNum
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
! na
! Obtains and Allocates WatertoAirHP related parameters from input file
IF (GetCoilsInputFlag) THEN !First time subroutine has been entered
CALL GetVarSpeedCoilInput
! WaterIndex=FindGlycol('WATER') !Initialize the WaterIndex once
GetCoilsInputFlag=.FALSE.
End If
IF (WSHPNum <= 0 .or. WSHPNum > NumWatertoAirHPs) THEN
CALL ShowSevereError('SetVarSpeedCoilData: called with VS WSHP Coil Number out of range='// &
TRIM(TrimSigDigits(WSHPNum))//' should be >0 and <'//TRIM(TrimSigDigits(NumWatertoAirHPs)))
ErrorsFound=.true.
RETURN
ENDIF
IF (PRESENT(CompanionCoolingCoilNum)) THEN
VarSpeedCoil(WSHPNum)%CompanionCoolingCoilNum=CompanionCoolingCoilNum
VarSpeedCoil(WSHPNum)%FindCompanionUpStreamCoil = .TRUE.
VarSpeedCoil(CompanionCoolingCoilNum)%CompanionHeatingCoilNum=WSHPNum
ENDIF
IF (PRESENT(CompanionHeatingCoilNum)) THEN
VarSpeedCoil(WSHPNum)%CompanionHeatingCoilNum=CompanionHeatingCoilNum
VarSpeedCoil(CompanionHeatingCoilNum)%CompanionCoolingCoilNum=WSHPNum
ENDIF
RETURN
END SUBROUTINE SetVarSpeedCoilData