RefrigRackData Derived Type

type, private :: RefrigRackData

Source Code


Components

TypeVisibility AttributesNameInitial
logical, public :: CoilFlag =.FALSE.
character(len=MaxNameLength), public :: Name =' '
character(len=MaxNameLength), public :: SupplyTankName =' '
character(len=MaxNameLength), public :: EndUseSubcategory ='General'
integer, public, ALLOCATABLE, DIMENSION(:):: CaseNum
integer, public, ALLOCATABLE, DIMENSION(:):: CoilNum
integer, public, ALLOCATABLE, DIMENSION(:):: WalkInNum
integer, public :: HeatRejectionLocation =0
integer, public :: CondenserType =0
real(kind=r64), public :: LaggedUsedWaterHeater
real(kind=r64), public :: LaggedUsedHVACCoil
real(kind=r64), public :: EvapEffect =0.9d0
real(kind=r64), public :: CondenserAirFlowRate =0.0d0
real(kind=r64), public :: EvapPumpPower =0.0d0
real(kind=r64), public :: ActualEvapPumpPower =0.0d0
real(kind=r64), public :: EvapPumpConsumption =0.0d0
real(kind=r64), public :: EvapWaterConsumpRate =0.0d0
real(kind=r64), public :: EvapWaterConsumption =0.0d0
integer, public :: EvapSchedPtr =0
real(kind=r64), public :: BasinHeaterPowerFTempDiff =0.0d0
real(kind=r64), public :: BasinHeaterSetPointTemp =2.0d0
real(kind=r64), public :: BasinHeaterPower =0.0d0
real(kind=r64), public :: BasinHeaterConsumption =0.0d0
real(kind=r64), public :: RatedCOP =0.0d0
integer, public :: COPFTempPtr =0
integer, public :: NumCases =0
integer, public :: NumCoils =0
integer, public :: NumWalkIns =0
integer, public :: EvapWaterSupplyMode =WaterSupplyFromMains
integer, public :: EvapWaterSupTankID =0
integer, public :: EvapWaterTankDemandARRID =0
integer, public :: OutsideAirNodeNum =0
integer, public :: HeatRejectionZoneNum =0
integer, public :: HeatRejectionZoneNodeNum =0
real(kind=r64), public :: TotalRackLoad =0.0d0
real(kind=r64), public :: RackCompressorCOP =0.0d0
real(kind=r64), public :: RackCompressorPower =0.0d0
real(kind=r64), public :: RackElecConsumption =0.0d0
real(kind=r64), public :: RackCapacity =0.0d0
real(kind=r64), public :: RackCoolingEnergy =0.0d0
real(kind=r64), public :: CondenserFanPower =0.0d0
integer, public :: TotCondFTempPtr =0
real(kind=r64), public :: ActualCondenserFanPower =0.0d0
real(kind=r64), public :: CondenserFanConsumption =0.0d0
real(kind=r64), public :: SensZoneCreditHeatRate =0.0d0
real(kind=r64), public :: SensZoneCreditHeat =0.0d0
real(kind=r64), public :: SensHVACCreditHeatRate =0.0d0
real(kind=r64), public :: SensHVACCreditHeat =0.0d0
integer, public :: EvapFreezeWarnIndex =0
integer, public :: NoFlowWarnIndex =0
integer, public :: HighTempWarnIndex =0
integer, public :: LowTempWarnIndex =0
integer, public :: HighFlowWarnIndex =0
integer, public :: HighInletWarnIndex =0
integer, public :: InletNode =0
real(kind=r64), public :: InletTemp =0.0d0
integer, public :: OutletNode =0
integer, public :: PlantTypeOfNum =0
integer, public :: PlantLoopNum =0
integer, public :: PlantLoopSideNum =0
integer, public :: PlantBranchNum =0
integer, public :: PlantCompNum =0
real(kind=r64), public :: OutletTemp =0.0d0
integer, public :: OutletTempSchedPtr =0
real(kind=r64), public :: VolFlowRate =0.0d0
real(kind=r64), public :: DesVolFlowRate =0.0d0
real(kind=r64), public :: MassFlowRate =0.0d0
real(kind=r64), public :: CondLoad =0.0d0
real(kind=r64), public :: CondEnergy =0.0d0
integer, public :: FlowType =1
real(kind=r64), public :: VolFlowRateMax =0.0d0
real(kind=r64), public :: MassFlowRateMax =0.0d0
real(kind=r64), public :: InletTempMin =10.0d0
real(kind=r64), public :: OutletTempMax =55.0d0
real(kind=r64), public :: TotalCoolingLoad =0.0d0

Source Code

TYPE, PRIVATE :: RefrigRackData
  LOGICAL    :: CoilFlag            = .FALSE.        ! Flag to show if coil type load on rack
  CHARACTER(len=MaxNameLength) :: Name=' '                   ! Name of Refrigeration Compressor rack
  CHARACTER(len=MaxNameLength) :: SupplyTankName=' '         ! Evap water supply tank name
  CHARACTER(len=MaxNameLength) :: EndUseSubcategory='General'! Rack end-use subcategory
 ! Index of refrigerated case (1 to NumCases) connected to rack #X
  INTEGER, ALLOCATABLE, DIMENSION(:) :: CaseNum
  INTEGER, ALLOCATABLE, DIMENSION(:) :: CoilNum
  INTEGER, ALLOCATABLE, DIMENSION(:) :: WalkInNum
  INTEGER          :: HeatRejectionLocation = 0  ! Refrigeration Compressor Rack heat rejection location
                                                 ! (1=LocationOutdoors or 2=LocationZone)
  INTEGER          :: CondenserType = 0          ! Specifies cooling mode for outdoor condenser
                                                 ! (1=Dry air, 2=Evap cooling, 3=Water-cooled)
  REAL(r64)        :: LaggedUsedWaterHeater      ! Heat reclaim used to heat water in previous zone/load time step(W)
  REAL(r64)        :: LaggedUsedHVACCoil         ! Heat reclaim used to heat HVAC coil in previous zone/load time step(W)
  REAL(r64)        :: EvapEffect=0.9d0             ! Effectiveness of evaporative condenser
  REAL(r64)        :: CondenserAirFlowRate=0.0d0   ! Evaporative condenser air volume flow rate (m3/s)
  REAL(r64)        :: EvapPumpPower=0.0d0          ! Evaporative cooling water pump power (W)
  REAL(r64)        :: ActualEvapPumpPower=0.0d0    ! Evaporative cooling water pump power, if adjusted (W)
  REAL(r64)        :: EvapPumpConsumption=0.0d0    ! Evaporative cooling water pump electric consumption (J)
  REAL(r64)        :: EvapWaterConsumpRate=0.0d0   ! Evaporative condenser water consumption rate (m3/s)
  REAL(r64)        :: EvapWaterConsumption=0.0d0   ! Evaporative condenser water consumption (m3)
  INTEGER          :: EvapSchedPtr=0             ! Index to the correct evap condenser availability schedule
  REAL(r64)        :: BasinHeaterPowerFTempDiff= 0.0d0 ! Basin heater capacity per degree K below setpoint (W/K)
  REAL(r64)        :: BasinHeaterSetPointTemp= 2.0d0 ! Setpoint temperature for basin heater operation (C)
  REAL(r64)        :: BasinHeaterPower=0.0d0       ! Power demand from basin heater (W)
  REAL(r64)        :: BasinHeaterConsumption=0.0d0 ! Electric consumption from basin heater (J)
  REAL(r64)        :: RatedCOP=0.0d0               ! Rated coefficient of performance for compressor rack (W/W)
  INTEGER          :: COPFTempPtr=0              ! Index to the correct COP curve object
  INTEGER          :: NumCases=0                 ! Total number of refrigerated cases attached to each rack
  INTEGER          :: NumCoils=0                 ! Total number of air chillers attached to each rack
  INTEGER          :: NumWalkIns=0               ! Total number of walk-ins attached to each rack
  INTEGER          :: EvapWaterSupplyMode = WaterSupplyFromMains !  Source of water for evap condenser cooling
  INTEGER          :: EvapWaterSupTankID = 0     ! TankID when evap condenser uses water from storage tank
  INTEGER          :: EvapWaterTankDemandARRID=0 ! Demand index when evap condenser uses water from storage tank
  INTEGER          :: OutsideAirNodeNum  = 0     ! Outside air node number
  INTEGER          :: HeatRejectionZoneNum = 0   ! Heat rejection zone number used when walk-ins present and ht rej to zone
  INTEGER          :: HeatRejectionZoneNodeNum = 0 ! Heat rejection zone node number used when walk-ins present and ht rej to zone
  REAL(r64)        :: TotalRackLoad=0.0d0          ! Total capacity of all refrigerated cases on rack
  REAL(r64)        :: RackCompressorCOP=0.0d0      ! Rack compressor COP at specific operating conditions
  REAL(r64)        :: RackCompressorPower=0.0d0    ! Total rack compressor power (W)
  REAL(r64)        :: RackElecConsumption =0.0d0   ! Total rack compressor electric consumption (J)
  REAL(r64)        :: RackCapacity=0.0d0           ! Total rack delivered capacity (W)
  REAL(r64)        :: RackCoolingEnergy=0.0d0      ! Total rack delivered energy (J)
  REAL(r64)        :: CondenserFanPower=0.0d0      ! Condenser fan power (W)
  INTEGER          :: TotCondFTempPtr=0          ! Index for condenser fan power modifier curve
                                                 ! (function of outdoor temperature)
  REAL(r64)        :: ActualCondenserFanPower=0.0d0  ! Rack condenser fan power (W)
  REAL(r64)        :: CondenserFanConsumption=0.0d0  ! Rack condenser fan electric consumption (J)
  REAL(r64)        :: SensZoneCreditHeatRate=0.0d0 ! Rack sensible heating zone credit rate (W)
  REAL(r64)        :: SensZoneCreditHeat=0.0d0     ! Rack sensible heating zone credit energy (J)
  REAL(r64)        :: SensHVACCreditHeatRate=0.0d0 ! Rack sensible heating HVAC credit rate (W)
  REAL(r64)        :: SensHVACCreditHeat=0.0d0     ! Rack sensible heating HVAC credit energy (J)
  INTEGER          :: EvapFreezeWarnIndex = 0    ! Recurring freeze warning index
  INTEGER          :: NoFlowWarnIndex = 0        ! No cooling water when needed warning index
  INTEGER          :: HighTempWarnIndex = 0      ! Water outlet high temp warning index
  INTEGER          :: LowTempWarnIndex = 0       ! Water outlet low temp warning index
  INTEGER          :: HighFlowWarnIndex = 0      ! Water outlet high flow warning index
  INTEGER          :: HighInletWarnIndex = 0     ! Water inlet high temp warning index
  INTEGER          :: InletNode = 0              ! Water-cooled condenser inlet node number
  REAL(r64)        :: InletTemp = 0.0d0            ! Water-cooling condenser inlet temperature (C)
  INTEGER          :: OutletNode = 0             ! Water-cooled condenser outlet node number
  INTEGER          :: PlantTypeOfNum = 0         ! Water-cooled condenser plant equipment type
  INTEGER          :: PlantLoopNum = 0           ! Water-cooled condenser plant loop number
  INTEGER          :: PlantLoopSideNum = 0       ! Water-cooled condenser plant loop side number
  INTEGER          :: PlantBranchNum = 0         ! Water-cooled condenser plant branch number
  INTEGER          :: PlantCompNum   = 0         ! Water-cooled condenser plant component number

  REAL(r64)        :: OutletTemp = 0.0d0           ! Water-cooling condenser outlet temperature (C)

  INTEGER          :: OutletTempSchedPtr = 0     ! Schedule pointer for condenser outlet temp setting
  REAL(r64)        :: VolFlowRate = 0.0d0          ! Water-cooled condenser volumetric flow rate (m3/s)
  REAL(r64)        :: DesVolFlowRate = 0.0d0       ! Water-cooled condenser design volumetric flow rate (m3/s)
  REAL(r64)        :: MassFlowRate = 0.0d0         ! Water-cooled condenser mass flow rate (kg/s)
  REAL(r64)        :: CondLoad = 0.0d0             ! Total condenser load (W)
  REAL(r64)        :: CondEnergy = 0.0d0           ! Condenser energy (J)
  INTEGER          :: FlowType = 1               ! Water-cooled condenser loop flow type
  REAL(r64)        :: VolFlowRateMax = 0.0d0       ! Maximum condenser volumetric flow rate (m3/s)
  REAL(r64)        :: MassFlowRateMax = 0.0d0      ! Maximum condenser mass flow rate (kg/s)
  REAL(r64)        :: InletTempMin = 10.0d0      ! Minimum condenser water inlet temperature (C)
  REAL(r64)        :: OutletTempMax = 55.0d0     ! Maximum condenser water outlet temperature (C)
  REAL(r64)        :: TotalCoolingLoad = 0.0d0
END TYPE RefrigRackData

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