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) | :: | SysName | |||
| character(len=*), | intent(in) | :: | VarDesc | |||
| real(kind=r64), | intent(in) | :: | VarValue | 
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 ReportSysSizing(SysName,VarDesc,VarValue)
    ! SUBROUTINE INFORMATION:
    !       AUTHOR         Fred Buhl
    !       DATE WRITTEN   January 2003
    !       MODIFIED       August 2008, Greg Stark
    !       RE-ENGINEERED  na
    ! PURPOSE OF THIS SUBROUTINE:
    ! This subroutine writes one item of system sizing data to the "eio" file..
    ! METHODOLOGY EMPLOYED:
    ! na
    ! REFERENCES:
    ! na
    ! USE STATEMENTS:
    USE DataPrecisionGlobals
    USE DataGlobals, ONLY : OutputFileInits
    USE DataStringGlobals, ONLY: VerString
    USE General, ONLY: RoundSigDigits
    ! BSLLC Start
    USE SQLiteProcedures
    ! BSLLC Finish
    IMPLICIT NONE    ! Enforce explicit typing of all variables in this routine
    ! SUBROUTINE ARGUMENT DEFINITIONS:
    CHARACTER(len=*), INTENT(IN) :: SysName   ! the name of the zone
    CHARACTER(len=*), INTENT(IN) :: VarDesc   ! the description of the input variable
    REAL(r64), INTENT(IN)        :: VarValue  ! the value from the sizing calculation
    ! SUBROUTINE PARAMETER DEFINITIONS:
    ! INTERFACE BLOCK SPECIFICATIONS
    ! na
    ! DERIVED TYPE DEFINITIONS
    ! na
    ! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
    LOGICAL, SAVE :: MyOneTimeFlag = .TRUE.
    IF (MyOneTimeFlag) THEN
        WRITE(OutputFileInits, 990)
        MyOneTimeFlag = .FALSE.
    END IF
    WRITE (OutputFileInits, 991) TRIM(SysName), TRIM(VarDesc), TRIM(RoundSigDigits(VarValue,5))
    ! BSLLC Start
    IF (WriteOutputToSQLite) CALL AddSQLiteSystemSizingRecord (SysName, VarDesc, VarValue)
    ! BSLLC Finish
    990 FORMAT('! <System Sizing Information>, System Name, ', 'Field Description, Value')
    991 FORMAT(' System Sizing Information',3(', ',A))
    RETURN
END SUBROUTINE ReportSysSizing