TransRefrigSystemData Derived Type

type, private :: TransRefrigSystemData

Name RefrigerantName EndUseSubcategory SystemRejectHeatToZone CaseNumMT CaseNumLT CompressorNumHP CompressorNumLP GasCoolerNum WalkInNumMT WalkInNumLT NumCasesLT NumCasesMT NumCompressorsHP NumCompressorsLP NumGasCoolers NumWalkInsLT NumWalkInsMT RefIndex SuctionPipeActualZoneNumMT SuctionPipeZoneNodeNumMT SuctionPipeActualZoneNumLT SuctionPipeZoneNodeNumLT TransSysType AverageCompressorCOP CpSatLiqCond CpSatVapEvapMT CpSatVapEvapLT CpSatLiqReceiver DelHSubcoolerDis DelHSubcoolerSuc HCaseInMT HCaseInLT HCompInHP HCompInLP HCompOutHP HCompOutLP HSatLiqCond HSatLiqReceiver HCaseOutMT HCaseOutLT NetHeatRejectLoad NetHeatRejectEnergy PipeHeatLoadMT PipeHeatLoadLT PipeHeatEnergy PipeHeatEnergyMT PipeHeatEnergyLT RefMassFlowtoMTLoads RefMassFlowtoLTLoads RefMassFlowCompsHP RefMassFlowCompsLP RefMassFlowComps RefMassFlowReceiverByPass RefInventory SCEffectiveness SumUASuctionPipingMT SumUASuctionPipingLT TCaseOutMT TCaseOutLT TCondense TReceiver PReceiver TCompInHP TCompInLP TCondenseMin TEvapDesignMT TEvapDesignLT TEvapNeededMT TEvapNeededLT TLiqInActual TotalCondDefrostCredit TotalCoolingEnergy TotalCoolingEnergyMT TotalCoolingEnergyLT TotalCoolingLoadMT TotalCoolingLoadLT TotalSystemLoad TotalSystemLoadMT TotalSystemLoadLT TotCompPowerHP TotCompPowerLP TotCompElecConsump TotCompElecConsumpHP TotCompElecConsumpLP TotCompCapacity TotCompCapacityHP TotCompCapacityLP TotCompCoolingEnergy TotCompCoolingEnergyHP TotCompCoolingEnergyLP TotRejectHeatRecovered UnmetEnergy UnmetEnergyMT UnmetEnergyLT UnmetEnergySaved UnmetEnergySavedMT UnmetEnergySavedLT

Source Code


Components

TypeVisibility AttributesNameInitial
character(len=MaxNameLength), public :: Name =' '
character(len=MaxNameLength), public :: RefrigerantName =' '
character(len=MaxNameLength), public :: EndUseSubcategory =' '
logical, public :: SystemRejectHeatToZone =.FALSE.
integer, public, ALLOCATABLE, DIMENSION(:):: CaseNumMT
integer, public, ALLOCATABLE, DIMENSION(:):: CaseNumLT
integer, public, ALLOCATABLE, DIMENSION(:):: CompressorNumHP
integer, public, ALLOCATABLE, DIMENSION(:):: CompressorNumLP
integer, public, ALLOCATABLE, DIMENSION(:):: GasCoolerNum
integer, public, ALLOCATABLE, DIMENSION(:):: WalkInNumMT
integer, public, ALLOCATABLE, DIMENSION(:):: WalkInNumLT
integer, public :: NumCasesLT =0
integer, public :: NumCasesMT =0
integer, public :: NumCompressorsHP =0
integer, public :: NumCompressorsLP =0
integer, public :: NumGasCoolers =1
integer, public :: NumWalkInsLT =0
integer, public :: NumWalkInsMT =0
integer, public :: RefIndex =0
integer, public :: SuctionPipeActualZoneNumMT =0
integer, public :: SuctionPipeZoneNodeNumMT =0
integer, public :: SuctionPipeActualZoneNumLT =0
integer, public :: SuctionPipeZoneNodeNumLT =0
integer, public :: TransSysType =0
real(kind=r64), public :: AverageCompressorCOP =0.0d0
real(kind=r64), public :: CpSatLiqCond =0.0d0
real(kind=r64), public :: CpSatVapEvapMT =0.0d0
real(kind=r64), public :: CpSatVapEvapLT =0.0d0
real(kind=r64), public :: CpSatLiqReceiver =0.0d0
real(kind=r64), public :: DelHSubcoolerDis =0.0d0
real(kind=r64), public :: DelHSubcoolerSuc =0.0d0
real(kind=r64), public :: HCaseInMT =0.0d0
real(kind=r64), public :: HCaseInLT =0.0d0
real(kind=r64), public :: HCompInHP =0.0d0
real(kind=r64), public :: HCompInLP =0.0d0
real(kind=r64), public :: HCompOutHP =0.0d0
real(kind=r64), public :: HCompOutLP =0.0d0
real(kind=r64), public :: HSatLiqCond =0.0d0
real(kind=r64), public :: HSatLiqReceiver =0.0d0
real(kind=r64), public :: HCaseOutMT =0.0d0
real(kind=r64), public :: HCaseOutLT =0.0d0
real(kind=r64), public :: NetHeatRejectLoad =0.0d0
real(kind=r64), public :: NetHeatRejectEnergy =0.0d0
real(kind=r64), public :: PipeHeatLoadMT =0.0d0
real(kind=r64), public :: PipeHeatLoadLT =0.0d0
real(kind=r64), public :: PipeHeatEnergy =0.0d0
real(kind=r64), public :: PipeHeatEnergyMT =0.0d0
real(kind=r64), public :: PipeHeatEnergyLT =0.0d0
real(kind=r64), public :: RefMassFlowtoMTLoads =0.0d0
real(kind=r64), public :: RefMassFlowtoLTLoads =0.0d0
real(kind=r64), public :: RefMassFlowCompsHP =0.0d0
real(kind=r64), public :: RefMassFlowCompsLP =0.0d0
real(kind=r64), public :: RefMassFlowComps =0.0d0
real(kind=r64), public :: RefMassFlowReceiverByPass =0.0d0
real(kind=r64), public :: RefInventory =0.0d0
real(kind=r64), public :: SCEffectiveness =0.0d0
real(kind=r64), public :: SumUASuctionPipingMT =0.0d0
real(kind=r64), public :: SumUASuctionPipingLT =0.0d0
real(kind=r64), public :: TCaseOutMT =0.0d0
real(kind=r64), public :: TCaseOutLT =0.0d0
real(kind=r64), public :: TCondense =0.0d0
real(kind=r64), public :: TReceiver =0.0d0
real(kind=r64), public :: PReceiver =0.0d0
real(kind=r64), public :: TCompInHP =0.0d0
real(kind=r64), public :: TCompInLP =0.0d0
real(kind=r64), public :: TCondenseMin =0.0d0
real(kind=r64), public :: TEvapDesignMT =0.0d0
real(kind=r64), public :: TEvapDesignLT =0.0d0
real(kind=r64), public :: TEvapNeededMT =0.0d0
real(kind=r64), public :: TEvapNeededLT =0.0d0
real(kind=r64), public :: TLiqInActual =0.0d0
real(kind=r64), public :: TotalCondDefrostCredit =0.0d0
real(kind=r64), public :: TotalCoolingEnergy =0.0d0
real(kind=r64), public :: TotalCoolingEnergyMT =0.0d0
real(kind=r64), public :: TotalCoolingEnergyLT =0.0d0
real(kind=r64), public :: TotalCoolingLoadMT =0.0d0
real(kind=r64), public :: TotalCoolingLoadLT =0.0d0
real(kind=r64), public :: TotalSystemLoad =0.0d0
real(kind=r64), public :: TotalSystemLoadMT =0.0d0
real(kind=r64), public :: TotalSystemLoadLT =0.0d0
real(kind=r64), public :: TotCompPowerHP =0.0d0
real(kind=r64), public :: TotCompPowerLP =0.0d0
real(kind=r64), public :: TotCompElecConsump =0.0d0
real(kind=r64), public :: TotCompElecConsumpHP =0.0d0
real(kind=r64), public :: TotCompElecConsumpLP =0.0d0
real(kind=r64), public :: TotCompCapacity =0.0d0
real(kind=r64), public :: TotCompCapacityHP =0.0d0
real(kind=r64), public :: TotCompCapacityLP =0.0d0
real(kind=r64), public :: TotCompCoolingEnergy =0.0d0
real(kind=r64), public :: TotCompCoolingEnergyHP =0.0d0
real(kind=r64), public :: TotCompCoolingEnergyLP =0.0d0
real(kind=r64), public :: TotRejectHeatRecovered =0.0d0
real(kind=r64), public :: UnmetEnergy =0.0d0
real(kind=r64), public :: UnmetEnergyMT =0.0d0
real(kind=r64), public :: UnmetEnergyLT =0.0d0
real(kind=r64), public :: UnmetEnergySaved =0.0d0
real(kind=r64), public :: UnmetEnergySavedMT =0.0d0
real(kind=r64), public :: UnmetEnergySavedLT =0.0d0

Source Code

TYPE, PRIVATE :: TransRefrigSystemData
  CHARACTER(len=MaxNameLength) :: Name=' '               ! Name of transcritical CO2 refrigeration system
  CHARACTER(len=MaxNameLength) :: RefrigerantName=' '    ! Name of refrigerant, must match name in FluidName
                                                         !    (see fluidpropertiesrefdata.idf)
  CHARACTER(len=MaxNameLength) :: EndUseSubcategory=' '  ! Used for reporting purposes
  LOGICAL    :: SystemRejectHeatToZone = .FALSE.         ! Flag to show air-cooled gas cooler located inside zone
  INTEGER, ALLOCATABLE, DIMENSION(:) :: CaseNumMT        ! absolute Index of medium temperature cases (allocated NumCasesMT)
  INTEGER, ALLOCATABLE, DIMENSION(:) :: CaseNumLT        ! absolute Index of low temperature cases (allocated NumCasesLT)
  INTEGER, ALLOCATABLE, DIMENSION(:) :: CompressorNumHP  ! absolute Index of high pressure compressors (allocated NumCompressorsHP)
  INTEGER, ALLOCATABLE, DIMENSION(:) :: CompressorNumLP  ! absolute Index of low pressure compressors (allocated NumCompressorsLP)
  INTEGER, ALLOCATABLE, DIMENSION(:) :: GasCoolerNum     ! absolute Index of gas cooler
  INTEGER, ALLOCATABLE, DIMENSION(:) :: WalkInNumMT      ! absolute Index of medium temperature walk ins (allocated NumWalkInsMT)
  INTEGER, ALLOCATABLE, DIMENSION(:) :: WalkInNumLT      ! absolute Index of low temperature walk ins (allocated NumWalkInsLT)
  INTEGER     :: NumCasesLT        = 0        ! Number of low temperature cases on this system
  INTEGER     :: NumCasesMT        = 0        ! Number of medium temperature cases on this system
  INTEGER     :: NumCompressorsHP  = 0        ! Number of high pressure compressors on this system
  INTEGER     :: NumCompressorsLP  = 0        ! Number of low pressure compressors on this system
  INTEGER     :: NumGasCoolers     = 1        ! Number of gas coolers on this system
  INTEGER     :: NumWalkInsLT      = 0        ! Number of low temperature walk in coolers on this system
  INTEGER     :: NumWalkInsMT      = 0        ! Number of medium temperature walk in coolers on this system
  INTEGER     :: RefIndex          = 0        ! Index number of refrigerant, automatically assigned on first call to fluid property
                                              !   and used thereafter
  INTEGER     :: SuctionPipeActualZoneNumMT  = 0   ! ID number for zone where medium temperature suction pipes gain heat
  INTEGER     :: SuctionPipeZoneNodeNumMT    = 0   ! ID number for zone node where medium temperature suction pipes gain heat
  INTEGER     :: SuctionPipeActualZoneNumLT  = 0   ! ID number for zone where medium temperature suction pipes gain heat
  INTEGER     :: SuctionPipeZoneNodeNumLT    = 0   ! ID number for zone node where medium temperature suction pipes gain heat
  INTEGER     :: TransSysType = 0             ! Transcritical refrigeration system type: SingleStage = 1, TwoStage=2
  REAL(r64)   :: AverageCompressorCOP=0.0d0   ! Average COP for compressers on this system (W)
  REAL(r64)   :: CpSatLiqCond = 0.0d0         ! Spec Heat of sat liquid at condensing pressure  (J/kg-C)
  REAL(r64)   :: CpSatVapEvapMT = 0.0d0       ! Spec Heat of saturated vapor exiting medium temperature evaporator (J/kg-C)
  REAL(r64)   :: CpSatVapEvapLT = 0.0d0       ! Spec Heat of saturated vapor exiting low temperature evaporator (J/kg-C)
  REAL(r64)   :: CpSatLiqReceiver = 0.0d0     ! Spec Heat of saturated liquid in receiver (J/kg-C)
  REAL(r64)   :: DelHSubcoolerDis = 0.0d0     ! Change in enthalpy across subcooler, hot side (J/kg)
  REAL(r64)   :: DelHSubcoolerSuc = 0.0d0     ! Change in enthalpy across subcooler, cold side (J/kg)
  REAL(r64)   :: HCaseInMT = 0.0d0            ! Medium temperature case inlet enthalpy (after subcoolers and pipe P drops) (J/kg)
  REAL(r64)   :: HCaseInLT = 0.0d0            ! Low temperature case inlet enthalpy (after pipe P drops) (J/kg)
  REAL(r64)   :: HCompInHP = 0.0d0            ! High pressure compressor inlet enthalpy  (J/kg)
  REAL(r64)   :: HCompInLP = 0.0d0            ! Low pressure compressor inlet enthalpy  (J/kg)
  REAL(r64)   :: HCompOutHP = 0.0d0           ! High pressure compressor outlet enthalpy (J/kg)
  REAL(r64)   :: HCompOutLP = 0.0d0           ! Low pressure compressor outlet enthalpy (J/kg)
  REAL(r64)   :: HSatLiqCond = 0.0d0          ! Enthalpy of sat liquid at condensing pressure  (J/kg)
  REAL(r64)   :: HSatLiqReceiver = 0.0d0      ! Enthalpy of sat liquid in receiver (J/kg)
  REAL(r64)   :: HCaseOutMT = 0.0d0           ! Enthalpy of refrigerant leaving medium temperature cases, after superheat (J/kg)
  REAL(r64)   :: HCaseOutLT = 0.0d0           ! Enthalpy of refrigerant leaving low temperature cases, after superheat (J/kg)
  REAL(r64)   :: NetHeatRejectLoad = 0.0d0    ! Portion of TotalCondenser load due to this system (after heat recovery) W
  REAL(r64)   :: NetHeatRejectEnergy = 0.0d0  ! Portion of TotalCondenser energy due to this system (after heat recovery) J
  REAL(r64)   :: PipeHeatLoadMT = 0.0d0       ! Total medium temperature suction pipe heat gains, optional (W)
  REAL(r64)   :: PipeHeatLoadLT = 0.0d0       ! Total low temperature suction pipe heat gains, optional (W)
  REAL(r64)   :: PipeHeatEnergy = 0.0d0       ! Total suction pipe heat gains, optional (J)
  REAL(r64)   :: PipeHeatEnergyMT = 0.0d0     ! Total medium temperature suction pipe heat gains, optional (J)
  REAL(r64)   :: PipeHeatEnergyLT = 0.0d0     ! Total low temperature suction pipe heat gains, optional (J)
  REAL(r64)   :: RefMassFlowtoMTLoads = 0.0d0 ! Refrigerant mass flow through medium temperature cases(kg/s)
  REAL(r64)   :: RefMassFlowtoLTLoads = 0.0d0 ! Refrigerant mass flow through low temperature cases(kg/s)
  REAL(r64)   :: RefMassFlowCompsHP = 0.0d0   ! Total system refrigerant mass flow through high pressue compressors(kg/s)
  REAL(r64)   :: RefMassFlowCompsLP = 0.0d0   ! Total system refrigerant mass flow through low pressue compressors(kg/s)
  REAL(r64)   :: RefMassFlowComps = 0.0d0     ! Total system refrigerant mass flow through all compressors (kg/s)
  REAL(r64)   :: RefMassFlowReceiverByPass = 0.0d0  ! Refrigerant mass flow through receiver bypass (kg/s)
  REAL(r64)   :: RefInventory = 0.0d0         ! Approximate refrigerant inventory entered by user (kg)
  REAL(r64)   :: SCEffectiveness = 0.0d0      ! Heat exchanger effectiveness of the subcooler
  REAL(r64)   :: SumUASuctionPipingMT = 0.0d0 ! Sum of U*A for medium temperature suction piping (W/C)
  REAL(r64)   :: SumUASuctionPipingLT = 0.0d0 ! Sum of U*A for low temperature suction piping (W/C)
  REAL(r64)   :: TCaseOutMT = 0.0d0           ! Medium temperature case out temperature including case superheat (C)
  REAL(r64)   :: TCaseOutLT = 0.0d0           ! Low temperature case out temperature including case superheat (C)
  REAL(r64)   :: TCondense = 0.0d0            ! Condensing temperature (Tsat for P discharge) (C)
  REAL(r64)   :: TReceiver = 0.0d0            ! Temperature in receiver (Tsat for P receiver) (C)
  REAL(r64)   :: PReceiver = 0.0d0            ! Pressure in receiver (Psat for T receiver) (C)
  REAL(r64)   :: TCompInHP = 0.0d0            ! High pressure compressor inlet temperature (after case and LSHX superheat and pipe delta P) (C)
  REAL(r64)   :: TCompInLP = 0.0d0            ! Low pressure compressor inlet temperature (after case and pipe delta P) (C)
  REAL(r64)   :: TCondenseMin = 0.0d0         ! Minimum allowed condensing temperature (C)
  REAL(r64)   :: TEvapDesignMT = 0.0d0        ! Min (on sys) design medium temperature case/walkin/secondary evap temp
  REAL(r64)   :: TEvapDesignLT = 0.0d0        ! Min (on sys) design low temperature case/walkin/secondary evap temp
  REAL(r64)   :: TEvapNeededMT = 0.0d0        ! Max MT Case evap temperature to maintain lowest case T on system (C)
  REAL(r64)   :: TEvapNeededLT = 0.0d0        ! Max LT Case evap temperature to maintain lowest case T on system (C)
  REAL(r64)   :: TLiqInActual = 0.0d0         ! Actual liquid temperature entering TXV after subcooling (C)
  REAL(r64)   :: TotalCondDefrostCredit = 0.0d0  ! sum of heat reclaimed for hot gas and hot brine defrost for cases/WI served directly [W]
  REAL(r64)   :: TotalCoolingEnergy = 0.0d0   ! Total energy of all refrigerated cases and walkins served directly (J)
  REAL(r64)   :: TotalCoolingEnergyMT = 0.0d0 ! Total energy of all medium temperature refrigerated cases and walkins served directly (J)
  REAL(r64)   :: TotalCoolingEnergyLT = 0.0d0 ! Total energy of all low temperature refrigerated cases and walkins served directly (J)
  REAL(r64)   :: TotalCoolingLoadMT = 0.0d0   ! Total medium temperature load of all refrigerated cases and walkins served directly (W)
  REAL(r64)   :: TotalCoolingLoadLT = 0.0d0   ! Total low temperature load of all refrigerated cases and walkins served directly (W)
  REAL(r64)   :: TotalSystemLoad = 0.0d0      ! Sum of MT and LT loads, W
  REAL(r64)   :: TotalSystemLoadMT = 0.0d0    ! Includes medium temperature cases and walk-ins, W
  REAL(r64)   :: TotalSystemLoadLT = 0.0d0    ! Includes low temperature cases and walk-ins, W
  REAL(r64)   :: TotCompPowerHP = 0.0d0       ! Total power for high pressure compressers on this system (W)
  REAL(r64)   :: TotCompPowerLP = 0.0d0       ! Total power for low pressure compressers on this system (W)
  REAL(r64)   :: TotCompElecConsump = 0.0d0   ! Total Elec consump for compressers on this system (J)
  REAL(r64)   :: TotCompElecConsumpHP = 0.0d0 ! Total Elec consumption for high pressure compressors on this system (J)
  REAL(r64)   :: TotCompElecConsumpLP = 0.0d0 ! Total Elec consumption for low pressure compressors on this system (J)
  REAL(r64)   :: TotCompCapacity = 0.0d0      ! Sum of HP and LP compressor capacity (W)
  REAL(r64)   :: TotCompCapacityHP = 0.0d0    ! Total design capacity for high pressure compressers on this system (W)
  REAL(r64)   :: TotCompCapacityLP = 0.0d0    ! Total design capacity for low pressure compressers on this system (W)
  REAL(r64)   :: TotCompCoolingEnergy = 0.0d0 ! Total cooling energy from compressers on this system (J)
  REAL(r64)   :: TotCompCoolingEnergyHP = 0.0d0  ! Total cooling energy from high pressure compressers on this system (J)
  REAL(r64)   :: TotCompCoolingEnergyLP = 0.0d0  ! Total cooling energy from low pressure compressers on this system (J)
  REAL(r64)   :: TotRejectHeatRecovered = 0.0d0  ! Total reject heat recovered for hot gas or hot brine defrost (W)
  REAL(r64)   :: UnmetEnergy = 0.0d0          ! Accumulative loads unmet by the LP and HP compressors on this system (J)
  REAL(r64)   :: UnmetEnergyMT = 0.0d0        ! Accumulative loads unmet by total HP compressors on this system (J)
  REAL(r64)   :: UnmetEnergyLT = 0.0d0        ! Accumulative loads unmet by total LP compressors on this system (J)
  REAL(r64)   :: UnmetEnergySaved =0.0d0      ! Accumulative loads unmet by the LP and HP compressors on this system (J)
  REAL(r64)   :: UnmetEnergySavedMT = 0.0d0   ! Accumulative loads unmet by total HP compressors on this system (J)
  REAL(r64)   :: UnmetEnergySavedLT = 0.0d0   ! Accumulative loads unmet by total LP compressors on this system (J)
END TYPE TransRefrigSystemData

ActuatorUsedType AiflowNetworkReportProp AirChillerSetData AirConnectionStruct AirflowNetworkCompProp AirflowNetworkExchangeProp AirflowNetworkLinkageProp AirflowNetworkLinkReportData AirflowNetworkLinkSimuData AirflowNetworkNodeProp AirflowNetworkNodeReportData AirflowNetworkNodeSimuData AirflowNetworkReportVars AirflowNetworkSimuProp AirIn AirLoopBranchData AirLoopCompData AirLoopControlData AirLoopFlowData AirLoopMixerData AirLoopOutsideAirConnectData AirLoopSplitterData AirLoopStatsType AirLooptoZoneData AirLoopZoneEquipConnectData AirModelData AirNodeData AirPatternInfobyZoneStruct AirReportVars AirTerminalMixerData AngleFactorData BalancedDesDehumPerfData BaseboardParams BaseboardParams BaseCell BaseChillerSpecs BasementZoneInfo BaseReportVars BaseThermalPropertySet BasisElemDescr BasisStruct BatteryDichargeDataStruct BBHeatData BinObjVarIDType BinResultsType BinStatisticsType BLASTAbsorberSpecs BoilerSpecs BoilerSpecs BoundingBoxVertStruct BranchData BranchData BranchListData BSDFBkSurfDescr BSDFDaylghtGeomDescr BSDFDaylghtPosition BSDFGeomDescr BSDFLayerAbsorpStruct BSDFRefPoints BSDFRefPointsGeomDescr BSDFStateDescr BSDFWindowDescript BSDFWindowGeomDescr BSDFWindowInputStruct cached_psat_t cached_twb_t CartesianCell CartesianPipeCellInformation CaseAndWalkInListDef CaseRAFractionData CaseWIZoneReportData CashFlowType CBVAVData CECInverterLookUpTableData CFSFILLGAS CFSGAP CFSLAYER CFSLWP CFSSWP CFSTY CGSHPNodeData ChargeBlockType ChargeSimpleType ChillerheaterSpecs CHReportVars CoefficientProps CoilCreditData CoilType CollectorData ColumnTagType CommonPipeData CompData CompDesWaterFlowData ComponentData ComponentData ComponentListData ComponentNameData ComponentProps ComponentSetPtData CompressorListDef CompSizeTableEntryType ComputationType ConnectAirSysComp ConnectAirSysSubComp ConnectAirSysSubSubComp ConnectedLoopData ConnectionPoint ConnectorData ConnectZoneComp ConnectZoneSubComp ConnectZoneSubSubComp ConstantFlowRadiantSystemData ConstCOPChillerSpecs ConstCOPReportVars ConstGradPattern ConstructionData ConstructionDataFD ContaminantData ControllerListProps ControllerPropsType ControllerStatsType ControlList ControlsType ConvectionCoefficient CoolBeamData CoolTowerParams CostAdjustmentStruct CostLineItemStruct CTGeneratorSpecs CurSimConditionsInfo CVData CVDVParameters CVFlow DamperDesignParams DamperFlowConditions DataPeriodData DataSetPointManager DaylightSavingPeriodData DayScheduleData DayWeatherVariables DCtoACInverterStruct DefineASHRAEAdaptiveOptimumStartCoeffs DefineColdestSetPointManager DefineCondEntSetPointManager DefineDiffTSysAvailManager DefineFollowOATempSetPointManager DefineFollowSysNodeTempSetPointManager DefineGroundTempSetPointManager DefineHiLoSysAvailManager DefineHybridVentSysAvailManager DefineIdealCondEntSetPointManager DefineLinearModelNode DefineMixedAirSetPointManager DefineNightCycSysAvailManager DefineNightVentSysAvailManager DefineOAPretreatSetPointManager DefineOptStartSysAvailManager DefineOutsideAirSetPointManager DefinePriAirSysAvailMgrs DefinePrimaryAirSystem DefineSchedDualSetPointManager DefineSchedOffSysAvailManager DefineSchedOnSysAvailManager DefineSchedSysAvailManager DefineScheduledSetPointManager DefineSurfaceSettings DefineSZCoolingSetPointManager DefineSZHeatingSetPointManager DefineSZMaxHumSetPointManager DefineSZMinHumSetPointManager DefineSZOneStageCoolinggSetPointManager DefineSZOneStageHeatingSetPointManager DefineSZReheatSetPointManager DefineWarmestSetPointManager DefineZoneCompAvailMgrs DefineZoneData DefMultiZoneAverageCoolingSetPointManager DefMultiZoneAverageHeatingSetPointManager DefMultiZoneAverageMaxHumSetPointManager DefMultiZoneAverageMinHumSetPointManager DefMultiZoneMaxHumSetPointManager DefMultiZoneMinHumSetPointManager DefRABFlowSetPointManager DefWarmestSetPtManagerTempFlow DemandManagerData DemandManagerListData DesDayWeathData DesiccantDehumidifierData DesignDayData DesignSpecMSHPData DetailedIceStorageData DirectAirProps DirectionNeighbor_Dictionary DirectionReal_Dictionary DisSysCompCoilProp DisSysCompCPDProp DisSysCompCVFProp DisSysCompDamperProp DisSysCompDetFanProp DisSysCompDuctProp DisSysCompELRProp DisSysCompHXProp DisSysCompLeakProp DisSysCompTermUnitProp DisSysLinkageProp DisSysNodeProp DistributionStructure DomainRectangle dTriangle DuctData DVData DXCoilData DXCoolingConditions DXHeatPumpSystemStruct EarthTubeData EarthTubeZoneReportVars EconVarType ElecBaseboardParams ElecStorageDataStruct ElectricChillerSpecs ElectricEIRChillerSpecs ElectricPowerLoadCenter ElectricRadiantSystemData ElectricReportVars ElectricTransformer EMSActuatorAvailableType EMSProgramCallManagementType EndUseCategoryType Energy EngineDrivenChillerSpecs EngineDrivenReportVars EnvironmentData EqNodeConnectionDef EquipConfiguration EquipList EquipListCompData EquipListPtrData EquipmentData EquipMeterData EquipOpList ErlExpressionType ErlStackType ErlValueType ErlVariableType EvapConditions EvapFluidCoolerInletConds EvapFluidCoolerspecs ExhaustAbsorberSpecs ExtendedFluidProperties ExteriorEquipmentUsage ExteriorLightUsage ExtVentedCavityStruct Face FanCoilData FanEquipConditions FarfieldInfo FaultProperties FCAirSupplyDataStruct FCAuxilHeatDataStruct FCDataStruct FCElecStorageDataStruct FCExhaustHXDataStruct FCInverterDataStruct FCPowerModuleStruct FCReportDataStruct FCStackCoolerDataStruct FCWaterSupplyDataStruct FenestrationSolarAbsorbed FileSectionsDefinition FluidCellInformation FluidCoolerInletConds FluidCoolerspecs FluidPropsGlycolData FluidPropsGlycolErrors FluidPropsGlycolRawData FluidPropsRefrigerantData FluidPropsRefrigErrors FrameDividerProperties FuelTypeProps FullDomainStructureInfo FurnaceEquipConditions GapDeflectionState GapSupportPillar GasAbsorberSpecs GasPropertyDataStruct GasTurbineReportVars GenData GeneratorDynamicsManagerStruct GeneratorFuelSupplyDataStruct GenericComponentZoneIntGainStruct GlheSpecs GlobalInternalGainMiscObject GridRegion GroundwaterWellDataStruct GshpSpecs GshpSpecs GshpSpecs GTChillerSpecs HalfLoopData HcInsideFaceUserCurveStruct HcOutsideFaceUserCurveStruct HeatExchangerStruct HeatExchCond HeatingCoilEquipConditions HeatPumpWaterHeaterData HeatReclaimDXCoilData HeatReclaimRefrigCondenserData HeatReclaimRefrigeratedRackData HighTempRadiantSystemData HumidifierData HVACAirLoopIterationConvergenceStruct HVACNodeConvergLogStruct HVACZoneInletConvergenceStruct HWBaseboardParams HXAssistedCoilParameters HydronicRadiantSystemData ICEngineGeneratorSpecs IceStorageMapping IceStorageSpecs IllumMapData IndirectAbsorberSpecs IndUnitData InfiltrationData InsideFaceAdaptiveConvAlgoStruct InstructionType IntegerVariables IntegerVariableType InternalVarsAvailableType InternalVarsUsedType IntWinAdjZoneExtWinStruct IrrigationDataStruct LightsData LineDefinition LocalPipeData Location LoopPipeData LoopSidePumpInformation LoopSideReportVars m_FlowControlValidator MapCalcData MarkedNodeData MaterialDataFD MaterialProperties MatrixDataStruct MeshExtents MeshPartition MeshPartitions MeshProperties MeterArrayType MeterData MeterType MicroCHPDataStruct MicroCHPParamsNonNormalized MicroCHPReportDataStruct MissingData MissingDataCounts MixerConditions MixerData MixerData MixingData MoistureInfo monetaryUnitType MonthlyColumnsType MonthlyFieldSetInputType MonthlyInputType MonthlyTablesType MoreNodeData MSHeatPumpData MSHeatPumpReportData MTGeneratorSpecs MultizoneCompDetOpeningProp MultizoneCompExhaustFanProp MultizoneCompHorOpeningProp MultizoneCompSimpleOpeningProp MultizoneCPArrayProp MultizoneCPValueProp MultizoneExternalNodeProp MultizoneSurfaceCrackProp MultizoneSurfaceCrackStdCndns MultizoneSurfaceELAProp MultizoneSurfaceProp MultizoneZoneProp NamedMonthlyType NeighborInformation NightVentPerfData NodeConnectionDef NodeData NodeListDef NonrecurringCostType OAControllerData OAControllerProps OAEquipList OAMixerProps OARequirementsData OAUnitData ObjectsDefinition OperationData OperatorType OpSchemePtrData OptStartDataType OSCData OSCMData OutputReportingVariables OutputTableBinnedType OutputVarSensorType OutsideAirSysProps OutsideEnergySourceSpecs OutsideFaceAdpativeConvAlgoStruct PackagedTESCoolingCoilStruct ParametersData ParentListData PeopleData PerfCurveTableDataStruct PerfomanceCurveData PipeCircuitInfo PipeData PipeHeatTransferReport PipeHTData PipeSegmentInfo PlaneEq PlantAvailMgrData PlantCallingOrderInfoStruct PlantConnection PlantConnectionStruct PlantConnectionStruct PlantConvergencePoint PlantIterationConvergenceStruct PlantLocation PlantLocatorStruct PlantLoopData PlantPressureCurveData PlantProfileData PlantSizingData Point Point3DInteger Point3DReal PointF PointType PollutionProps Polyhedron PondGroundHeatExchangerData PondGroundHeatExchangerReport PowIndUnitData PTUnitData PumpSpecs PumpVFDControlData PVArrayStruct PVReportVariables PVTCollectorStruct PVTReportStruct QualifyType RadialCellInformation RadialSizing RadSysTypeData RainfallCollectorDataStruct RangeCheckDef RangeDataCounts RatchetType RealVariables RealVariableType RectangleF RecurringCostsType RecurringErrorData ReformulatedEIRChillerSpecs RefrigCaseCreditData RefrigCaseData RefrigCompressorData RefrigCondenserData RefrigGasCoolerData RefrigRackData RefrigSystemData ReportBranchData ReportCompData ReportEIRVars ReportingInformation ReportLoopData reportNameType ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReportVars ReqReportVariables ReturnAir RoofGeoCharactisticsStruct RootFinderDataType RunPeriodData RuntimeReportVarType ScheduleData ScheduleTypeData ScreenTransData SecondaryLoopData SecretObjects SectionsDefinition ShadingVertexData ShadowingCombinations ShadowRelateType ShelfData SimplePVParamsStruct SimplePVTModelStruct SimpleWatertoAirHPConditions SimulationControl SimulationOrder SiteRainFallDataStruct SlabListData SNLModuleParamsStuct SNLPVCalcStruct SNLPVInputStruct SolReflRecSurfData SolutionTrackerType SpecialDayData SpectralDataProperties SplitterConditions SplitterData SplitterData StackType StandAloneERVData SteamBaseboardParams SteamCoilEquipConditions StorageTankDataStruct StormWindowData StratifiedNodeData subcell SubcomponentData SubcoolerData SubEquipmentData SubSubcomponentData SubSubEquipmentData SubTableType SummarizeLoads SupplyAir SurfaceAssocNestedStruct SurfaceData SurfaceDataFD SurfaceErrorTracking SurfaceGroundHeatExchangerData SurfaceGroundHeatExchangerQTF SurfaceGroundHeatExchngrReport SurfaceListData SurfaceScreenProperties SurfaceSolarIncident SurfaceWindowCalc SurfMapPattern SysAvailManagerList SysDesignParams SysFlowConditions SystemSizingData SystemSizingInputData TableDataStruct TableEntryType TableLookupData TariffType TCGlazingsType TDDPipeData TemperaturePatternStruct TemperValveData TempGridRegionData TempLoopData TempVsHeightPattern TerminalUnitListData TermUnitSizingData ThermalChimneyData ThermalComfortDataType ThermalComfortInASH55Type ThermalComfortSetpointType ThermChimReportVars ThermChimZnReportVars TimeSteps timings TOCEntriesType TokenType TowerInletConds Towerspecs TransferLoadListDef TransRefrigSystemData TrendVariableType TriQuadraticCurveDataStruct TRNSYSPVCalcStruct TRNSYSPVModuleParamsStruct TStatObject TwoVertGradInterpolPattern TypicalExtremeData UFEData UFIData UnitarySystemData UnitConvType UnitHeaterData UnitVentilatorData UseAdjustmentType UsePriceEscalationType UserAirTerminalComponentStruct UserCoilComponentStruct UserPlantComponentStruct UserZoneHVACForcedAirComponentStruct UTSCDataStruct VariableSpeedCoilData VariableTypeForDDOutput vector Vector_2d VentilatedSlabData VentilationData VentilationMechanicalProps VRFCondenserEquipment VRFTerminalUnitEquipment VSTowerData WalkInData WarehouseCoilData WarmupConvergence WaterCoilEquipConditions WaterConnectionsType WaterEquipmentType WaterHeaterDesuperheaterData WaterHeaterSizingData WaterSourceSpecs WaterThermalTankData WatertoAirHPEquipConditions WaterUseTankConnectionStruct WeatherProperties WeekScheduleData WholeBuildingElectricPowerSummary WindACData WindowBlindProperties WindowComplexShade WindowIndex WindowShadingControlData WindowStateIndex WindowThermalModelParams WindTurbineParams WrapperComponentSpecs WrapperReportVars WrapperSpecs ZoneAirBalanceData ZoneAirDistributionData ZoneAirEquip ZoneCatEUseData ZoneComfortControls ZoneComfortControlsFangerData ZoneComfortFangerControlType ZoneCompTypeData ZoneContamGenericDataBLDiff ZoneContamGenericDataConstant ZoneContamGenericDataCutoff ZoneContamGenericDataDecay ZoneContamGenericDataDRS ZoneContamGenericDataDVS ZoneContamGenericDataPDriven ZoneContControls ZoneData ZoneDaylightCalc ZoneDehumidifierData ZoneEqSizingData ZoneEquipData ZoneEvapCoolerUnitStruct ZoneGroupData ZoneHumidityControls ZoneInternalGainsStruct ZoneListData ZoneListData ZonePreDefRepType ZonePurchasedAir ZoneReportVars ZoneReturnPlenumConditions ZoneSatgedControls ZoneSimData ZoneSizingData ZoneSizingInputData ZoneSupplyPlenumConditions ZoneSystemContaminantDemandData ZoneSystemDemandData ZoneSystemMoistureDemand ZoneTempControls ZoneTempControlType ZoneViewFactorInformation