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) | :: | SimpleWSHPNum | |||
logical, | intent(inout) | :: | ErrorsFound | |||
integer, | intent(in) | :: | WaterCyclingMode | |||
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 SetSimpleWSHPData(SimpleWSHPNum,ErrorsFound,WaterCyclingMode,CompanionCoolingCoilNum,CompanionHeatingCoilNum)
! SUBROUTINE INFORMATION:
! AUTHOR Richard Raustad
! DATE WRITTEN June 2009
! 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) :: SimpleWSHPNum ! Number of OA Controller
LOGICAL, INTENT(INOUT) :: ErrorsFound ! Set to true if certain errors found
INTEGER, INTENT(IN) :: WaterCyclingMode ! the coil water flow mode (cycling, constant or constantondemand)
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 GetSimpleWatertoAirHPInput
! WaterIndex=FindGlycol('WATER') !Initialize the WaterIndex once
GetCoilsInputFlag=.FALSE.
End If
IF (SimpleWSHPNum <= 0 .or. SimpleWSHPNum > NumWatertoAirHPs) THEN
CALL ShowSevereError('SetSimpleWSHPData: called with WSHP Coil Number out of range='// &
TRIM(TrimSigDigits(SimpleWSHPNum))//' should be >0 and <'//TRIM(TrimSigDigits(NumWatertoAirHPs)))
ErrorsFound=.true.
RETURN
ENDIF
SimpleWatertoAirHP(SimpleWSHPNum)%WaterCyclingMode = WaterCyclingMode
IF (PRESENT(CompanionCoolingCoilNum)) THEN
SimpleWatertoAirHP(SimpleWSHPNum)%CompanionCoolingCoilNum=CompanionCoolingCoilNum
SimpleWatertoAirHP(CompanionCoolingCoilNum)%CompanionHeatingCoilNum=SimpleWSHPNum
SimpleWatertoAirHP(CompanionCoolingCoilNum)%WaterCyclingMode = WaterCyclingMode
ENDIF
IF (PRESENT(CompanionHeatingCoilNum)) THEN
SimpleWatertoAirHP(SimpleWSHPNum)%CompanionHeatingCoilNum=CompanionHeatingCoilNum
SimpleWatertoAirHP(CompanionHeatingCoilNum)%CompanionCoolingCoilNum=SimpleWSHPNum
SimpleWatertoAirHP(CompanionHeatingCoilNum)%WaterCyclingMode = WaterCyclingMode
ENDIF
RETURN
END SUBROUTINE SetSimpleWSHPData