cbl_dryLeaf_module Module


Used by

  • module~~cbl_dryleaf_module~~UsedByGraph module~cbl_dryleaf_module cbl_dryLeaf_module proc~define_canopy define_canopy proc~define_canopy->module~cbl_dryleaf_module

Functions

private function ej3x(parx, alpha, convex, x) result(z)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: parx
real, intent(in) :: alpha
real, intent(in) :: convex
real, intent(in) :: x

Return Value real

private function ej4x(parx, alpha, convex, x) result(z)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: parx
real, intent(in) :: alpha
real, intent(in) :: convex
real, intent(in) :: x

Return Value real

private function xvcmxt4(x) result(z)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: x

Return Value real

private function xvcmxt3(x) result(z)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: x

Return Value real

private function xrdt(x)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: x

Return Value real

private function xejmxt3(x) result(z)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: x

Return Value real


Subroutines

public subroutine dryLeaf(dels, rad, rough, air, met, veg, canopy, soil, ssnow, dsx, fwsoil, tlfx, tlfy, ecy, hcy, rny, gbhu, gbhf, csx, cansat, ghwet, iter, climate, sum_rad_gradis, sum_rad_rniso)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: dels
type(radiation_type), intent(inout) :: rad
type(roughness_type), intent(inout) :: rough
type(air_type), intent(inout) :: air
type(met_type), intent(inout) :: met
type(veg_parameter_type), intent(inout) :: veg
type(canopy_type), intent(inout) :: canopy
type(soil_parameter_type), intent(inout) :: soil
type(soil_snow_type), intent(inout) :: ssnow
real, intent(inout), DIMENSION(:) :: dsx
real, intent(inout), DIMENSION(:) :: fwsoil
real, intent(inout), DIMENSION(:) :: tlfx
real, intent(inout), DIMENSION(:) :: tlfy
real(kind=R_2), intent(inout), DIMENSION(:) :: ecy
real(kind=R_2), intent(inout), DIMENSION(:) :: hcy
real(kind=R_2), intent(inout), DIMENSION(:) :: rny
real(kind=R_2), intent(inout), DIMENSION(:,:) :: gbhu
real(kind=R_2), intent(inout), DIMENSION(:,:) :: gbhf
real(kind=R_2), intent(inout), DIMENSION(:,:) :: csx
real, intent(in), DIMENSION(:) :: cansat
real(kind=r_2), intent(out), DIMENSION(:) :: ghwet
integer, intent(in) :: iter
type(climate_type), intent(in) :: climate
real, intent(in) :: sum_rad_gradis(mp)
real, intent(in) :: sum_rad_rniso(mp)

private subroutine getrex_1d(theta, rex, fws, Fs, thetaS, thetaw, Etrans, gamma, dx, dt, zr)

Arguments

Type IntentOptional Attributes Name
real(kind=r_2), intent(in), DIMENSION(:) :: theta
real(kind=r_2), intent(inout), DIMENSION(:) :: rex
real(kind=r_2), intent(inout) :: fws
real(kind=r_2), intent(in), DIMENSION(:) :: Fs
real(kind=r_2), intent(in), DIMENSION(:) :: thetaS
real(kind=r_2), intent(in), DIMENSION(:) :: thetaw
real(kind=r_2), intent(in) :: Etrans
real(kind=r_2), intent(in) :: gamma
real(kind=r_2), intent(in), DIMENSION(:) :: dx
real(kind=r_2), intent(in) :: dt
real(kind=r_2), intent(in) :: zr