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 DayltgCurrentExtHorizIllum
! SUBROUTINE INFORMATION:
! AUTHOR Fred Winkelmann
! DATE WRITTEN July 1997
! MODIFIED Nov98 (FW); Nov 2000 (FW)
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! CALCULATES EXTERIOR DAYLIGHT ILLUMINANCE AND LUMINOUS EFFICACY
! METHODOLOGY EMPLOYED:
! CALLED by SetCurrentWeather.
! CALCULATES THE CURRENT-TIME-STEP
! ILLUMINANCE ON AN UNOBSTRUCTED HORIZONTAL SURFACE FROM THE
! THE SKY AND FROM DIRECT SUN.
! REFERENCES:
! Based on DOE-2.1E subroutine DEXTIL.
! USE STATEMENTS:
! na
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
! na
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
REAL(r64) :: SDIRH ! Exterior horizontal beam irradiance (W/m2)
REAL(r64) :: SDIFH ! Exterior horizontal sky diffuse irradiance (W/m2)
!REAL(r64) :: PDIRLW ! Luminous efficacy (lum/W) of beam solar radiation
!REAL(r64) :: PDIFLW ! Luminous efficacy (lum/W) of sky diffuse solar radiation
! DIRECT AND DIFFUSE HORIZONTAL SOLAR IRRADIANCE (W/M2).
! SOLCOS(3), below, is the cosine of the solar zenith angle.
!
IF(SunIsUp) THEN
SDIRH = BeamSolarRad * SOLCOS(3)
SDIFH = DifSolarRad
! Fraction of sky covered by clouds
CloudFraction = (SDIFH/(SDIRH+SDIFH+0.0001d0))**2
!
! Luminous efficacy of sky diffuse solar and beam solar (lumens/W);
! Horizontal illuminance from sky and horizontal beam illuminance (lux)
! obtained from solar quantities on weather file and luminous efficacy.
CALL DayltgLuminousEfficacy (PDIFLW,PDIRLW)
HISKF = SDIFH * PDIFLW
HISUNF = SDIRH * PDIRLW
HISUNFnorm = BeamSolarRad * PDIRLW
ELSE
SDIRH = 0.d0
SDIFH = 0.d0
CloudFraction = 0.d0
PDIFLW = 0.d0
PDIRLW = 0.d0
HISKF = 0.d0
HISUNF = 0.d0
HISUNFnorm = 0.d0
SkyClearness = 0.d0
SkyBrightness = 0.d0
END IF
RETURN
END SUBROUTINE DayltgCurrentExtHorizIllum