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.
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 ReportOutputFileHeaders
! SUBROUTINE INFORMATION:
! AUTHOR Rick Strand
! DATE WRITTEN June 1997
! MODIFIED na
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! This subroutine prints out the necessary header information required
! by the EnergyPlus output file format. This subroutine can be
! replicated in any other modules which must send data to the output
! file.
! METHODOLOGY EMPLOYED:
! For each report, the report flag integer must be saved from the
! global report number counter. Then, the report counter must be
! incremented. Finally, the header information for the report must
! be sent to the output file.
! REFERENCES:
! EnergyPlus Output Description document.
! USE STATEMENTS:
USE OutputProcessor, ONLY: TimeStepStampReportNbr,DailyStampReportNbr,MonthlyStampReportNbr,RunPeriodStampReportNbr, &
TimeStepStampReportChr,DailyStampReportChr,MonthlyStampReportChr,RunPeriodStampReportChr
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
! na
! SUBROUTINE PARAMETER DEFINITIONS:
CHARACTER(len=*), PARAMETER :: IntFmt="(I3)"
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
! Format descriptor for the environment title
CHARACTER(len=*), PARAMETER :: EnvironmentFormat = "(a,',5,Environment Title[],Latitude[deg],"// &
"Longitude[deg],Time Zone[],Elevation[m]')"
CHARACTER(len=*), PARAMETER :: TimeStepFormat = "(a,',6,Day of Simulation[],Month[],Day of Month[],"// &
"DST Indicator[1=yes 0=no],Hour[],StartMinute[],EndMinute[],DayType')"
CHARACTER(len=*), PARAMETER :: DailyFormat = "(a,',3,Cumulative Day of Simulation[],Month[],Day of Month[]," // &
"DST Indicator[1=yes 0=no],DayType ! When Daily ',A,' Requested')"
CHARACTER(len=*), PARAMETER :: MonthlyFormat = "(a,',2,Cumulative Days of Simulation[],Month[]" // &
" ! When Monthly ',A,' Requested')"
CHARACTER(len=*), PARAMETER :: RunPeriodFormat = "(a,',1,Cumulative Days of Simulation[]" // &
" ! When Run Period ',A,' Requested')"
! FLOW:
CALL AssignReportNumber(EnvironmentReportNbr)
IF (EnvironmentReportNbr /= 1) THEN ! problem
CALL ShowFatalError('ReportOutputFileHeaders: Assigned report number for Environment title is not 1. Contact Support.')
ENDIF
WRITE(EnvironmentReportChr,IntFmt) EnvironmentReportNbr
EnvironmentReportChr=ADJUSTL(EnvironmentReportChr)
WRITE (OutputFileStandard,EnvironmentFormat) TRIM(EnvironmentReportChr)
WRITE (OutputFileMeters,EnvironmentFormat) TRIM(EnvironmentReportChr)
CALL AssignReportNumber(TimeStepStampReportNbr)
WRITE(TimeStepStampReportChr,IntFmt) TimeStepStampReportNbr
TimeStepStampReportChr=ADJUSTL(TimeStepStampReportChr)
WRITE (OutputFileStandard,TimeStepFormat) TRIM(TimeStepStampReportChr)
WRITE (OutputFileMeters,TimeStepFormat) TRIM(TimeStepStampReportChr)
CALL AssignReportNumber(DailyStampReportNbr)
WRITE(DailyStampReportChr,IntFmt) DailyStampReportNbr
DailyStampReportChr=ADJUSTL(DailyStampReportChr)
WRITE (OutputFileStandard,DailyFormat) TRIM(DailyStampReportChr),'Report Variables'
WRITE (OutputFileMeters,DailyFormat) TRIM(DailyStampReportChr),'Meters'
CALL AssignReportNumber(MonthlyStampReportNbr)
WRITE(MonthlyStampReportChr,IntFmt) MonthlyStampReportNbr
MonthlyStampReportChr=ADJUSTL(MonthlyStampReportChr)
WRITE (OutputFileStandard,MonthlyFormat) TRIM(MonthlyStampReportChr),'Report Variables'
WRITE (OutputFileMeters,MonthlyFormat) TRIM(MonthlyStampReportChr),'Meters'
CALL AssignReportNumber(RunPeriodStampReportNbr)
WRITE(RunPeriodStampReportChr,IntFmt) RunPeriodStampReportNbr
RunPeriodStampReportChr=ADJUSTL(RunPeriodStampReportChr)
WRITE (OutputFileStandard,RunPeriodFormat) TRIM(RunPeriodStampReportChr),'Report Variables'
WRITE (OutputFileMeters,RunPeriodFormat) TRIM(RunPeriodStampReportChr),'Meters'
RETURN
END SUBROUTINE ReportOutputFileHeaders