CABLE_WEATHERGENERATOR Module


Used by

  • module~~cable_weathergenerator~~UsedByGraph module~cable_weathergenerator CABLE_WEATHERGENERATOR proc~cru_get_subdiurnal_met CRU_GET_SUBDIURNAL_MET proc~cru_get_subdiurnal_met->module~cable_weathergenerator proc~plume_mip_get_met PLUME_MIP_GET_MET proc~plume_mip_get_met->module~cable_weathergenerator

Variables

Type Visibility Attributes Name Initial
integer, private, parameter :: sp = 8
real(kind=sp), private, parameter :: Pi = 3.14159265
real(kind=sp), private, parameter :: PiBy2 = 1.57079632
real(kind=sp), private, parameter :: SecDay = 86400.0
real(kind=sp), private, parameter :: SolarConst = 1370*SecDay/1e6
real(kind=sp), private, parameter :: epsilon = 0.736
real(kind=sp), private, parameter :: SBoltz = 5.67e-8

Derived Types

type, public ::  WEATHER_GENERATOR_TYPE

Components

Type Visibility Attributes Name Initial
integer, public :: np
integer, public :: ndtime
real, public :: delT
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: LatDeg
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: WindDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempMinDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempMaxDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempMinDayNext
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempMaxDayPrev
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: SolarMJDay
real(kind=sp), public :: DecRad
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: WindDark
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: WindLite
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: SolarNorm
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: LatRad
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: DayLength
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TimeSunsetPrev
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TimeSunrise
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TimeMaxTemp
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TimeSunset
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempSunsetPrev
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempSunset
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempNightRate
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempNightRatePrev
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempRangeDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: TempRangeAft
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: PrecipDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: SnowDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: PmbDay
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: PhiSd
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: PhiLd
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: Precip
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: Snow
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: Wind
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: Temp
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: VapPmb
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: Pmb
real(kind=sp), public, DIMENSION(:), ALLOCATABLE :: coszen

Subroutines

public subroutine WGEN_INIT(WG, np, latitude, dels)

Arguments

Type IntentOptional Attributes Name
type(WEATHER_GENERATOR_TYPE) :: WG
integer, intent(in) :: np
real, intent(in) :: latitude(np)
real, intent(in) :: dels

public subroutine WGEN_DAILY_CONSTANTS(WG, np, YearDay)

Arguments

Type IntentOptional Attributes Name
type(WEATHER_GENERATOR_TYPE) :: WG
integer, intent(in) :: np
integer, intent(in) :: YearDay

public subroutine WGEN_SUBDIURNAL_MET(WG, np, itime)

Arguments

Type IntentOptional Attributes Name
type(WEATHER_GENERATOR_TYPE) :: WG
integer, intent(in) :: np
integer, intent(in) :: itime