cable_mpimaster Module



Variables

Type Visibility Attributes Name Initial
integer, private :: wnp
integer, private, ALLOCATABLE, DIMENSION(:,:) :: m3d_t
integer, private, ALLOCATABLE, DIMENSION(:,:) :: mat_t
integer, private, ALLOCATABLE, DIMENSION(:) :: vec_t
integer, private, ALLOCATABLE, DIMENSION(:) :: inp_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: recv_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: restart_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: casa_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: casa_dump_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: casa_LUC_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: climate_ts
integer, private :: pop_ts
integer, private, ALLOCATABLE, DIMENSION(:) :: inp_req
integer, private, ALLOCATABLE, DIMENSION(:,:) :: inp_stats
integer, private, ALLOCATABLE, DIMENSION(:) :: recv_req
integer, private, ALLOCATABLE, DIMENSION(:,:) :: recv_stats
type(lpdecomp_t), private, ALLOCATABLE, DIMENSION(:) :: wland

Subroutines

public subroutine mpidrv_master(comm, dels, koffset, kend, PLUME, CRU)

Arguments

Type IntentOptional Attributes Name
integer :: comm
real, intent(inout) :: dels

Time step size in seconds

integer, intent(inout) :: koffset

Timestep to start at

integer, intent(inout) :: kend

No. of time steps in run

type(PLUME_MIP_TYPE), intent(in) :: PLUME
type(CRU_TYPE), intent(in) :: CRU

private subroutine master_decomp(comm, mland)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
integer, intent(in) :: mland

private subroutine master_cable_params(comm, met, air, ssnow, veg, bgc, soil, canopy, rough, rad, sum_flux, bal)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
type(met_type), intent(inout) :: met
type(air_type), intent(inout) :: air
type(soil_snow_type), intent(inout) :: ssnow
type(veg_parameter_type), intent(inout) :: veg
type(bgc_pool_type), intent(inout) :: bgc
type(soil_parameter_type), intent(inout) :: soil
type(canopy_type), intent(inout) :: canopy
type(roughness_type), intent(inout) :: rough
type(radiation_type), intent(inout) :: rad
type(sum_flux_type), intent(inout) :: sum_flux
type(balances_type), intent(inout) :: bal

private subroutine master_casa_params(comm, casabiome, casapool, casaflux, casamet, casabal, phen)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
type(casa_biome), intent(inout) :: casabiome
type(casa_pool), intent(inout) :: casapool
type(casa_flux), intent(inout) :: casaflux
type(casa_met), intent(inout) :: casamet
type(casa_balance), intent(inout) :: casabal
type(phen_variable), intent(inout) :: phen

private subroutine master_intypes(comm, met, veg)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
type(met_type), intent(in) :: met
type(veg_parameter_type), intent(in) :: veg

private subroutine master_outtypes(comm, met, canopy, ssnow, rad, bal, air, soil, veg)

Arguments

Type IntentOptional Attributes Name
integer :: comm
type(met_type), intent(in) :: met
type(canopy_type), intent(in) :: canopy
type(soil_snow_type), intent(in) :: ssnow
type(radiation_type), intent(in) :: rad
type(balances_type), intent(inout) :: bal
type(air_type), intent(in) :: air
type(soil_parameter_type), intent(in) :: soil
type(veg_parameter_type), intent(in) :: veg

private subroutine master_casa_types(comm, casapool, casaflux, casamet, casabal, phen)

Arguments

Type IntentOptional Attributes Name
integer :: comm
type(casa_pool), intent(inout) :: casapool
type(casa_flux), intent(inout) :: casaflux
type(casa_met), intent(inout) :: casamet
type(casa_balance), intent(inout) :: casabal
type(phen_variable), intent(inout) :: phen

private subroutine master_climate_types(comm, climate, ktauday)

Arguments

Type IntentOptional Attributes Name
integer :: comm
type(climate_type) :: climate
integer :: ktauday

private subroutine master_restart_types(comm, canopy, air, bgc)

Arguments

Type IntentOptional Attributes Name
integer :: comm
type(canopy_type), intent(in) :: canopy
type(air_type), intent(in) :: air
type(bgc_pool_type), intent(in) :: bgc

private subroutine master_casa_dump_types(comm, casamet, casaflux, phen)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
type(casa_met), intent(inout) :: casamet
type(casa_flux), intent(inout) :: casaflux
type(phen_variable), intent(inout) :: phen

private subroutine master_casa_LUC_types(comm, casapool, casabal)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
type(casa_pool), intent(in) :: casapool
type(casa_balance), intent(in) :: casabal

private subroutine master_pop_types(comm, pop)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
type(POP_TYPE), intent(inout) :: pop

private subroutine master_receive_pop(pop, comm)

Arguments

Type IntentOptional Attributes Name
type(POP_TYPE), intent(inout) :: pop
integer, intent(in) :: comm

private subroutine master_send_input(comm, dtypes, ktau)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
integer, intent(in), DIMENSION(:) :: dtypes
integer, intent(in) :: ktau

private subroutine master_receive(comm, ktau, types)

Arguments

Type IntentOptional Attributes Name
integer, intent(in) :: comm
integer, intent(in) :: ktau
integer, intent(in), DIMENSION(:) :: types

private subroutine master_end(icycle, restart)

Arguments

Type IntentOptional Attributes Name
integer :: icycle
logical :: restart

private subroutine master_spincasacnp(dels, kstart, kend, mloop, veg, soil, casabiome, casapool, casaflux, casamet, casabal, phen, POP, climate, icomm, ocomm)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: dels
integer, intent(in) :: kstart
integer, intent(in) :: kend
integer, intent(in) :: mloop
type(veg_parameter_type), intent(inout) :: veg
type(soil_parameter_type), intent(inout) :: soil
type(casa_biome), intent(inout) :: casabiome
type(casa_pool), intent(inout) :: casapool
type(casa_flux), intent(inout) :: casaflux
type(casa_met), intent(inout) :: casamet
type(casa_balance), intent(inout) :: casabal
type(phen_variable), intent(inout) :: phen
type(POP_TYPE), intent(inout) :: POP
type(climate_type), intent(inout) :: climate
integer, intent(in) :: icomm
integer, intent(in) :: ocomm

private subroutine master_CASAONLY_LUC(dels, kstart, kend, veg, casabiome, casapool, casaflux, casamet, casabal, phen, POP, climate, LUC_EXPT, POPLUC, icomm, ocomm)

Arguments

Type IntentOptional Attributes Name
real, intent(in) :: dels
integer, intent(in) :: kstart
integer, intent(in) :: kend
type(veg_parameter_type), intent(inout) :: veg
type(casa_biome), intent(inout) :: casabiome
type(casa_pool), intent(inout) :: casapool
type(casa_flux), intent(inout) :: casaflux
type(casa_met), intent(inout) :: casamet
type(casa_balance), intent(inout) :: casabal
type(phen_variable), intent(inout) :: phen
type(POP_TYPE), intent(inout) :: POP
type(climate_type), intent(inout) :: climate
type(LUC_EXPT_TYPE), intent(inout) :: LUC_EXPT
type(POPLUC_TYPE), intent(inout) :: POPLUC
integer, intent(in) :: icomm
integer, intent(in) :: ocomm