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 StartingWinTempsForNominalCond
! SUBROUTINE INFORMATION:
! AUTHOR F. Winkelmann
! DATE WRITTEN September 2000
! MODIFIED na
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! Initializes face temperature distribution prior to iteration.
! This is a shortened form of StartingWindowTemps for use in calculating
! the nominal center-of-glass U-value.
! METHODOLOGY EMPLOYED:
! na
! REFERENCES:
! na
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
! na
! SUBROUTINE PARAMETER DEFINITIONS:
REAL(r64),PARAMETER :: hrad = 5.3d0 ! Typical radiative conductance (W/m2-K)
REAL(r64),PARAMETER :: hcinStartValue = 3.2d0 ! Starting value for inside air film convective
! conductance (estimated for typical double glazing
! using 1.31(dT**0.333), where dT =
! room air temp - inside surface temp = 14.2K)
REAL(r64),PARAMETER :: resgap = 0.21d0 ! Typical gap resistance (m2-K/W)
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
INTEGER :: i ! Face counter
REAL(r64) :: rguess(11) ! Combined radiative/convective resistance (m2-K/W) of
! inside or outside air film, or gap
REAL(r64) :: restot ! Total window resistance including outside
! and inside air films (m2-K/W)
REAL(r64) :: temdiff ! Inside/outside air temperature difference (K)
REAL(r64) :: ressum ! Resistance sum (m2-K/W)
rguess(1) = 1.0d0/(hcout+hrad)
rguess(nglface+1) = 1.0d0/(hcinStartValue+hrad)
do i = 2,nglface,2
rguess(i) = 1.0d0/scon(i/2)
if(i<nglface) rguess(i+1) = resgap
end do
restot = 0.0d0
do i = 1,nglface+1
restot = restot + rguess(i)
enddo
temdiff = tin - tout
if(abs(temdiff)<0.5d0) temdiff = 2.0d0
ressum = 0.0d0
do i = 1,nglface
ressum = ressum + rguess(i)
thetas(i) = (ressum/restot)*temdiff + tout
end do
return
END SUBROUTINE StartingWinTempsForNominalCond