CABLE_LUC_EXPT Module



Variables

Type Visibility Attributes Name Initial
type(LUC_EXPT_TYPE), public, SAVE :: LUC_EXPT
integer, public, parameter :: ptos = 1
integer, public, parameter :: ptog = 2
integer, public, parameter :: stog = 3
integer, public, parameter :: gtos = 4
integer, public, parameter :: grassfrac = 5
integer, public, parameter :: primffrac = 6
integer, public, parameter :: pharv = 7
integer, public, parameter :: smharv = 8
integer, public, parameter :: syharv = 9

Derived Types

type, public ::  LUC_INPUT_TYPE

Components

Type Visibility Attributes Name Initial
real, public, DIMENSION(:), ALLOCATABLE :: VAL

type, public ::  LUC_EXPT_TYPE

Components

Type Visibility Attributes Name Initial
character(len=200), public :: TransitionFilePath
character(len=200), public :: ClimateFile
character(len=200), public :: Run
logical, public :: DirectRead
logical, public :: READrst
logical, public :: WRITErst
logical, public, ALLOCATABLE :: prim_only(:)
logical, public, ALLOCATABLE :: ptos(:)
logical, public, ALLOCATABLE :: ptog(:)
logical, public, ALLOCATABLE :: stog(:)
logical, public, ALLOCATABLE :: gtos(:)
integer, public, ALLOCATABLE :: ivegp(:)
integer, public, ALLOCATABLE :: biome(:)
integer, public :: YearStart
integer, public :: YearEnd
integer, public :: nfile
integer, public :: CTSTEP
real, public, ALLOCATABLE :: primaryf(:)
real, public, ALLOCATABLE :: mtemp_min20(:)
real, public, ALLOCATABLE :: grass(:)
real, public, ALLOCATABLE :: secdf(:)
character(len=200), public, DIMENSION(9) :: TransFile
character(len=12), public, DIMENSION(9) :: VAR_NAME
integer, public, DIMENSION(9) :: F_ID
integer, public, DIMENSION(9) :: V_ID
type(LUC_INPUT_TYPE), public, DIMENSION(9) :: INPUT
integer, public :: YEAR
integer, public :: ydimsize
integer, public :: xdimsize
integer, public :: nrec
integer, public :: FirstYear

Subroutines

public subroutine LUC_EXPT_INIT(LUC_EXPT)

Arguments

Type IntentOptional Attributes Name
type(LUC_EXPT_TYPE), intent(inout) :: LUC_EXPT

public subroutine LUC_EXPT_SET_TILES(inVeg, inPFrac, LUC_EXPT)

Arguments

Type IntentOptional Attributes Name
integer, intent(inout) :: inVeg(:,:,:)
real, intent(inout) :: inPFrac(:,:,:)
type(LUC_EXPT_TYPE), intent(inout) :: LUC_EXPT

public subroutine READ_ClimateFile(LUC_EXPT)

Arguments

Type IntentOptional Attributes Name
type(LUC_EXPT_TYPE), intent(inout) :: LUC_EXPT

public subroutine READ_LUH2(LUC_EXPT)

Arguments

Type IntentOptional Attributes Name
type(LUC_EXPT_TYPE), intent(inout) :: LUC_EXPT