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.
SUBROUTINE UpdateUtilityBills
! SUBROUTINE INFORMATION:
! AUTHOR Jason Glazer of GARD Analytics, Inc.
! DATE WRITTEN September 2003
! MODIFIED na
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! Single routine used to call all get input
! routines for economics.
! METHODOLOGY EMPLOYED:
! REFERENCES:
! na
! USE STATEMENTS:
USE DataGlobals, ONLY: DoOutputReporting, KindOfSim, ksRunPeriodWeather
USE DataInterfaces, ONLY: ShowFatalError
USE OutputReportTabular, ONLY: AddTOCEntry
! SUBROUTINE ARGUMENT DEFINITIONS:
! na
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! INTERFACE BLOCK SPECIFICATIONS
! na
! DERIVED TYPE DEFINITIONS
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
IMPLICIT NONE
LOGICAL, SAVE :: GetInput = .TRUE.
LOGICAL :: ErrorsFound = .false.
IF (GetInput) THEN
CALL GetInputEconomicsTariff(ErrorsFound)
! do rest of GetInput only if at least one tariff is defined.
CALL GetInputEconomicsCurrencyType(ErrorsFound)
IF (numTariff .GE. 1) THEN
IF (.not. ErrorsFound) CALL AddTOCEntry('Economics Results Summary Report','Entire Facility')
CALL CreateCategoryNativeVariables
CALL GetInputEconomicsQualify(ErrorsFound)
CALL GetInputEconomicsChargeSimple(ErrorsFound)
CALL GetInputEconomicsChargeBlock(ErrorsFound)
CALL GetInputEconomicsRatchet(ErrorsFound)
CALL GetInputEconomicsVariable(ErrorsFound)
CALL GetInputEconomicsComputation(ErrorsFound)
CALL CreateDefaultComputation
END IF
GetInput = .FALSE.
IF (ErrorsFound) CALL ShowFatalError('UpdateUtilityBills: Preceding errors cause termination.')
END IF
IF (DoOutputReporting .and. (KindOfSim == ksRunPeriodWeather)) THEN
CALL GatherForEconomics
END IF
END SUBROUTINE UpdateUtilityBills