ISBA_P_t Derived Type

type, public :: ISBA_P_t


Contents

Source Code


Components

TypeVisibility AttributesNameInitial
integer, public :: NSIZE_P
real, public, POINTER, DIMENSION(:):: XPATCH
real, public, POINTER, DIMENSION(:,:):: XVEGTYPE_PATCH
integer, public, POINTER, DIMENSION(:):: NR_P
real, public, POINTER, DIMENSION(:):: XPATCH_OLD
real, public, POINTER, DIMENSION(:):: XANMAX
real, public, POINTER, DIMENSION(:):: XFZERO
real, public, POINTER, DIMENSION(:):: XEPSO
real, public, POINTER, DIMENSION(:):: XGAMM
real, public, POINTER, DIMENSION(:):: XQDGAMM
real, public, POINTER, DIMENSION(:):: XQDGMES
real, public, POINTER, DIMENSION(:):: XT1GMES
real, public, POINTER, DIMENSION(:):: XT2GMES
real, public, POINTER, DIMENSION(:):: XAMAX
real, public, POINTER, DIMENSION(:):: XQDAMAX
real, public, POINTER, DIMENSION(:):: XT1AMAX
real, public, POINTER, DIMENSION(:):: XT2AMAX
real, public, POINTER, DIMENSION(:):: XAH
real, public, POINTER, DIMENSION(:):: XBH
real, public, POINTER, DIMENSION(:):: XTAU_WOOD
real, public, POINTER, DIMENSION(:,:):: XINCREASE
real, public, POINTER, DIMENSION(:,:):: XTURNOVER
real, public, POINTER, DIMENSION(:,:):: XCONDSAT
real, public, POINTER, DIMENSION(:):: XTAUICE
real, public, POINTER, DIMENSION(:):: XC1SAT
real, public, POINTER, DIMENSION(:):: XC2REF
real, public, POINTER, DIMENSION(:,:):: XC3
real, public, POINTER, DIMENSION(:):: XC4REF
real, public, POINTER, DIMENSION(:):: XBSLAI_NITRO
real, public, POINTER, DIMENSION(:):: XCPS
real, public, POINTER, DIMENSION(:):: XLVTT
real, public, POINTER, DIMENSION(:):: XLSTT
real, public, POINTER, DIMENSION(:):: XRUNOFFD
real, public, POINTER, DIMENSION(:,:):: XDZG
real, public, POINTER, DIMENSION(:,:):: XDZDIF
real, public, POINTER, DIMENSION(:,:):: XSOILWGHT
real, public, POINTER, DIMENSION(:):: XKSAT_ICE
real, public, POINTER, DIMENSION(:,:):: XTOPQS
real, public, POINTER, DIMENSION(:,:):: XDG
real, public, POINTER, DIMENSION(:,:):: XDG_OLD
real, public, POINTER, DIMENSION(:):: XDG2
integer, public, POINTER, DIMENSION(:):: NWG_LAYER
real, public, POINTER, DIMENSION(:):: XDROOT
real, public, POINTER, DIMENSION(:,:):: XROOTFRAC
real, public, POINTER, DIMENSION(:):: XD_ICE
real, public, POINTER, DIMENSION(:):: XH_TREE
real, public, POINTER, DIMENSION(:):: XZ0_O_Z0H
real, public, POINTER, DIMENSION(:):: XRE25
real, public, POINTER, DIMENSION(:):: XDMAX
real, public, POINTER, DIMENSION(:,:):: XRED_NOISE
real, public, POINTER, DIMENSION(:,:):: XINCR
real, public, POINTER, DIMENSION(:,:,:):: XHO

Source Code

TYPE ISBA_P_t
!
INTEGER  :: NSIZE_P ! number of sub-patchs/tiles              (-)
!
REAL, POINTER, DIMENSION(:)    :: XPATCH         ! fraction of each tile/patch   (-)
!
! Mask and number of grid elements containing patches/tiles:
!
REAL, POINTER, DIMENSION(:,:)  :: XVEGTYPE_PATCH ! fraction of each vegetation type for
!
INTEGER, POINTER, DIMENSION(:) :: NR_P    ! patch/tile mask  
!
REAL, POINTER, DIMENSION(:)    :: XPATCH_OLD     ! fraction of each tile/patchfor land use (-)
!
!
REAL, POINTER, DIMENSION(:)    :: XANMAX         ! maximum photosynthesis rate             (
REAL, POINTER, DIMENSION(:)    :: XFZERO         ! ideal value of F, no photo- 
!                                                ! respiration or saturation deficit  
REAL, POINTER, DIMENSION(:)    :: XEPSO          ! maximum initial quantum use             
!                                                ! efficiency                              (mg J-1 PAR)
REAL, POINTER, DIMENSION(:)    :: XGAMM          ! CO2 conpensation concentration          (ppm)
REAL, POINTER, DIMENSION(:)    :: XQDGAMM        ! Log of Q10 function for CO2 conpensation 
!                                               ! concentration                           (-)
REAL, POINTER, DIMENSION(:)    :: XQDGMES        ! Log of Q10 function for mesophyll conductance  (-)
REAL, POINTER, DIMENSION(:)    :: XT1GMES        ! reference temperature for computing 
!                                                ! compensation concentration function for 
!                                                ! mesophyll conductance: minimum
!                                                ! temperature                             (K)
REAL, POINTER, DIMENSION(:)    :: XT2GMES        ! reference temperature for computing 
!                                                ! compensation concentration function for 
!                                                ! mesophyll conductance: maximum
!                                                ! temperature                             (K)
REAL, POINTER, DIMENSION(:)    :: XAMAX          ! leaf photosynthetic capacity            (mg m-2 s-1)
REAL, POINTER, DIMENSION(:)    :: XQDAMAX        ! Log of Q10 function for leaf photosynthetic 
!                                                ! capacity                                (-)
REAL, POINTER, DIMENSION(:)    :: XT1AMAX        ! reference temperature for computing 
!                                                ! compensation concentration function for 
!                                                ! leaf photosynthetic capacity: minimum
!                                                ! temperature                             (K)
REAL, POINTER, DIMENSION(:)    :: XT2AMAX        ! reference temperature for computing 
!                                                ! compensation concentration function for 
!                                                ! leaf photosynthetic capacity: maximum
!                                                ! temperature                             (K)
REAL, POINTER, DIMENSION(:)    :: XAH            ! coefficients for herbaceous water stress 
!                                                ! response (offensive or defensive)       (log(mm/s))
REAL, POINTER, DIMENSION(:)    :: XBH            ! coefficients for herbaceous water stress 
!                                                ! response (offensive or defensive)
REAL, POINTER, DIMENSION(:)    :: XTAU_WOOD      ! residence time in woody biomass         (s)
REAL, POINTER, DIMENSION(:,:)   :: XINCREASE     ! biomass increase                     (kg/m2/day)
REAL, POINTER, DIMENSION(:,:)   :: XTURNOVER     ! turnover rates from biomass to litter (gC/m2/s)
!
! *Soil hydraulic characteristics
!
REAL, POINTER, DIMENSION(:,:)  :: XCONDSAT       ! hydraulic conductivity at saturation    (m/s)
!
REAL, POINTER, DIMENSION(:)      :: XTAUICE        ! soil freezing characteristic timescale  (s)
!
REAL, POINTER, DIMENSION(:)    :: XC1SAT         ! 'Force-Restore' C1 coefficient at 
!                                                ! saturation                              (-)
REAL, POINTER, DIMENSION(:)    :: XC2REF         ! 'Force-Restore' reference value of C2   (-)
REAL, POINTER, DIMENSION(:,:)  :: XC3            ! 'Force-Restore' C3 drainage coefficient (m)
REAL, POINTER, DIMENSION(:)    :: XC4REF         ! 'Force-Restore' sub-surface vertical 
!                                                ! for lateral drainage ('DIF' option)
!
REAL, POINTER, DIMENSION(:)    :: XBSLAI_NITRO   ! biomass/LAI ratio from nitrogen 
!                                                  ! decline theory                        (kg/m2)
! * Soil thermal characteristics
!
REAL, POINTER, DIMENSION(:)    :: XCPS
REAL, POINTER, DIMENSION(:)    :: XLVTT
REAL, POINTER, DIMENSION(:)    :: XLSTT
!
! * Initialize hydrology
!
  REAL, POINTER, DIMENSION(:)    :: XRUNOFFD     ! depth over which sub-grid runoff is
!                                                ! computed: in Force-Restore this is the
!                                                ! total soil column ('2-L'), or root zone
!                                                ! ('3-L'). For the 'DIF' option, it can
!                                                ! be any depth within soil column         (m)
!
REAL, POINTER, DIMENSION(:,:)  :: XDZG           ! soil layers thicknesses (DIF option)
REAL, POINTER, DIMENSION(:,:)  :: XDZDIF         ! distance between consecuative layer mid-points (DIF option)
REAL, POINTER, DIMENSION(:,:)  :: XSOILWGHT      ! VEG-DIF: weights for vertical
!                                                ! integration of soil water and properties
!
REAL, POINTER, DIMENSION(:)  :: XKSAT_ICE        ! hydraulic conductivity at saturation
!                                                    over frozen area (m s-1)
!
REAL, POINTER, DIMENSION(:,:) :: XTOPQS  ! Topmodel subsurface flow by layer (m/s)
!
REAL, POINTER, DIMENSION(:,:) :: XDG           ! soil layer depth                  (m)
!                                                ! NOTE: in Force-Restore mode, the 
!                                                ! uppermost layer depth is superficial
!                                                ! and is only explicitly used for soil 
!                                                ! water phase changes                     (m)
!
REAL, POINTER, DIMENSION(:,:)  :: XDG_OLD      ! For land use
REAL, POINTER, DIMENSION(:)    :: XDG2
INTEGER, POINTER, DIMENSION(:) :: NWG_LAYER    ! Number of soil moisture layers for DIF
REAL, POINTER, DIMENSION(:)    :: XDROOT       ! effective root depth for DIF (m)
REAL, POINTER, DIMENSION(:,:)  :: XROOTFRAC    ! root fraction profile ('DIF' option)
!
REAL, POINTER, DIMENSION(:) :: XD_ICE          ! depth of the soil column for the calculation
!                                                 of the frozen soil fraction (m)
!
REAL, POINTER, DIMENSION(:) :: XH_TREE         ! height of trees                         (m)
!
REAL, POINTER, DIMENSION(:) :: XZ0_O_Z0H       ! ratio of surface roughness lengths
!                                                ! (momentum to heat)                      (-)
!
REAL, POINTER, DIMENSION(:) :: XRE25           ! Ecosystem respiration parameter         (kg/kg.m.s-1)
!
REAL, POINTER, DIMENSION(:) :: XDMAX           ! maximum air saturation deficit
!                                                ! tolerate by vegetation
!                                                (kg/kg)
!
REAL, POINTER, DIMENSION(:,:)     :: XRED_NOISE
REAL, POINTER, DIMENSION(:,:)     :: XINCR
REAL, POINTER, DIMENSION(:,:,:)   :: XHO
!
END TYPE ISBA_P_t