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 | ||
---|---|---|---|---|---|---|
character(len=*), | intent(in) | :: | currentModuleObject | |||
character(len=*), | intent(in) | :: | resourceType | |||
character(len=*), | intent(in) | :: | fieldName | |||
character(len=*), | intent(in) | :: | scheduleName | |||
integer, | intent(inout) | :: | schedulePtr | |||
logical, | intent(inout) | :: | errorsFound |
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 CheckFFSchedule(currentModuleObject,resourceType,fieldName,scheduleName,schedulePtr,errorsFound)
! SUBROUTINE INFORMATION:
! AUTHOR Linda Lawrie
! DATE WRITTEN September 2009
! MODIFIED na
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! This support routine performs the "obtain schedule pointer" and checks Fuel Factor
! schedules for validity (values must be >= 0).
! METHODOLOGY EMPLOYED:
! na
! REFERENCES:
! na
! USE STATEMENTS:
USE DataInterfaces, ONLY: ShowSevereError,ShowContinueError
USE ScheduleManager, ONLY: GetScheduleIndex, CheckScheduleValueMinMax
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
CHARACTER(len=*), INTENT(IN) :: currentModuleObject ! the module Object
CHARACTER(len=*), INTENT(IN) :: resourceType ! resource type (Natural Gas, etc)
CHARACTER(len=*), INTENT(IN) :: fieldName ! Actual field name
CHARACTER(len=*), INTENT(IN) :: scheduleName ! Schedule Name as input
INTEGER, INTENT(INOUT) :: schedulePtr ! Schedule Index
LOGICAL, INTENT(INOUT) :: errorsFound ! true if errors found
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
! na
schedulePtr = GetScheduleIndex(scheduleName)
IF (schedulePtr == 0) THEN
CALL ShowSevereError(currentModuleObject//': '//resourceType//', invalid '//fieldName// &
'="'//scheduleName//'" not found.')
errorsFound = .true.
ELSEIF (.NOT. CheckScheduleValueMinMax(schedulePtr,'>=',0.0d0)) THEN
CALL ShowSevereError(currentModuleObject//': '//resourceType//', invalid '//fieldName// &
'="'//scheduleName//'" invalid values.')
CALL ShowContinueError('Schedule values must be (>=0.).')
errorsFound=.true.
END IF
RETURN
END SUBROUTINE CheckFFSchedule