PUBLIC INTERFACE ~ PUBLIC DATA ~ PUBLIC ROUTINES ~ NAMELIST ~ DIAGNOSTIC FIELDS ~ ERROR MESSAGES ~ REFERENCES ~ NOTES

Module land_properties_mod

Contact:  Christopher Milly
Reviewers:  Elena Shevliakova Sergey Malyshev
Change History: WebCVS Log


OVERVIEW

Contains land properties namelist variables and procedures relating to the properties of the land.

Initialization and calculation of the land property data. The input cover field and implied glacier field are obtained and the glacier mask and cover type are redefined, if necessary. The properties that depend on cover and ground types are assigned. The land properties diagnostics are initialized and the static fields are sent to the diagnostic manager for output.

Updates the rapidly changing parameters. Computes the albedo of the hypothetical no-snow and deep-snow surfaces and uses snow mass to blend snow-free and deep-snow albedo values. Regrids integer index data to any output grid from a uniformly spaced grid using a maximum-area voting scheme. Includes calculation of total area of each land cover type within the territory and the determination of the type occupying the biggest area within the territory.


OTHER MODULES USED

  mpp_domains_mod
time_manager_mod
mpp_io_mod
fms_mod
constants_mod
horiz_interp_mod
climap_albedo_mod
diag_manager_mod
topography_mod

PUBLIC INTERFACE

land_properties_init:
Initialize land property data.
update_land_properties_slow:
Updates slowly changing parameters, such as cover type.
update_land_properties_fast:
Updates the rapidly changing parameters, such as albedo.
regrid_discrete_field:
Regrids integer index data to any output grid from a uniformly spaced grid using a maximum-area voting scheme.
typemax:
Calculation of total area of each land cover type within the territory and the determination of the type occupying the biggest area within the territory.
init_land_properties_diag:
Initializes land properties diagnostics.
diag_static:
Sends static fields to diagnostic output.
land_properties_end:
Deallocates the land property data.


PUBLIC DATA

None.


PUBLIC ROUTINES

  1. land_properties_init

    subroutine land_properties_init ( &
         lonb,   latb,  land,  time,  domain, &
         glacier,         &
         lake,            &
         rough_momentum,  &
         rough_heat,      &
         rough_scale,     &  ! topographic roughness for drag scaling
         soil_therm_con,  &
         soil_therm_cap,  &
         veg_rs_min,      &
         max_water,       &
         tau_groundwater, &
         max_snow_out,    &
         cover_type,      &
         id_lon, id_lat )
    
      real,            intent(in) :: lonb(:), latb(:) ! boundaries of the cells,
                                                      ! radian
      logical,         intent(in) :: land(:,:,:)      ! land mask
      type(time_type), intent(in) :: time             ! current time
      type(domain2d),  intent(in) :: domain           ! our domain 
    
      logical, intent(out), dimension(:,:,:) :: glacier, lake ! glacier, lake masks
      real   , intent(out), dimension(:,:,:) :: &
           rough_momentum, &                  ! roughness length for momentum
           rough_heat,     &                
           rough_scale,    &
           veg_rs_min,     & 
           max_water,      &
           tau_groundwater                    ! groundwater residence time
      real   , intent(out), dimension(:,:,:,:) :: &
           soil_therm_con, &
           soil_therm_cap
      real   , intent(out)  :: max_snow_out
      integer, intent(out), dimension(:,:,:) :: cover_type
      integer, intent(in) :: id_lon, id_lat   ! ids of diagnostic axes
    call land_properties_init (lonb, latb, land, time, domain, & glacier, lake, rough_momentum, rough_heat, soil_therm_con, & soil_therm_cap, veg_rs_min, max_water, tau_groundwater, max_snow_out, & id_lon, id_lat )
    DESCRIPTION
    Reads and re-grids each land input data field and allocates arrays. The input cover field and implied glacier field are obtained, if either will be needed. Then, the ice cover type is reset to tundra. It may be changed back to ice according to actual glacier specification later. The glacier mask and cover type are redefined, if necessary.

    The appropriate cover type to glacier cells is assigned, if any. The ground (soil) type is defined and the groundwater residence time is calculated. The properties that depend on cover and ground types are assigned. If requested, the snow-free albedo is changed to the CLIMAP array.

    The land properties diagnostics are initialized and the static fields are sent to the diagnostic manager for output.


    NOTE
    ---- Cover (vegetation) type. There are 12 possible cases: veg_to_use can take 4 values, and glaciers can be (1) absent, (2) based on input cover field, or (3) based on climap albedo field. (use of climap albedo forces use of climap to locate glaciers, if glaciers are used.) the code ensures consistency between cover_type field and glacier mask, with the latter taking precedence: where glacier based on input cover field must be removed in deference to climap or if no glaciers are used, such points are assigned tundra (or global constant) type.

    ---- Ground (soil) type. To force consistency with glacier, already defined, any ice soil types are first re-set to coarse soil. ice types are then located on the basis of glacier. note that a distinct ice type is used only if soil_to_use='variable'; this is in contrast to the analogous treatment of vegetation types.


  2. update_land_properties_slow

    subroutine update_land_properties_slow ( &
         lonb,   latb,  land,  time,  domain, &
         glacier,         &
         lake,            &
         rough_momentum,  &
         rough_heat,      &
         rough_scale,     &  ! topographic roughness for drag scaling
         soil_therm_con,  &
         soil_therm_cap,  &
         veg_rs_min,      &
         max_water,       &
         tau_groundwater, &
         max_snow_out,    &
         cover_type )
    
      real,            intent(in) :: lonb(:), latb(:) ! boundaries of the cells,
                                                      ! radian
      logical,         intent(in) :: land(:,:,:)      ! land mask
      type(time_type), intent(in) :: time             ! current time
      type(domain2d),  intent(in) :: domain           ! our domain 
    
      logical, intent(out), dimension(:,:,:) :: glacier  ! glacier mask
      logical, intent(out), dimension(:,:,:) :: lake     ! lake mask
      real   , intent(out), dimension(:,:,:) :: &
           rough_momentum, &                  ! roughness length for momentum
           rough_heat,     &                
           rough_scale,    &
           veg_rs_min,     & 
           max_water,      &
           tau_groundwater                    ! groundwater residence time
      real   , intent(out), dimension(:,:,:,:) :: &
           soil_therm_con, &
           soil_therm_cap
      real   , intent(out)  :: max_snow_out
      integer, intent(inout), dimension(:,:,:)  :: cover_type
    DESCRIPTION
    Updates slowly changing parameters, such as cover type.


    NOTE
    ---- Cover (vegetation) type. There are 12 possible cases: veg_to_use can take 4 values, and glaciers can be (1) absent, (2) based on input cover field, or (3) based on climap albedo field. (use of climap albedo forces use of climap to locate glaciers, if glaciers are used.) the code ensures consistency between cover_type field and glacier mask, with the latter taking precedence: where glacier based on input cover field must be removed in deference to climap or if no glaciers are used, such points are assigned tundra (or global constant) type.

    ---- Ground (soil) type. Any ice soil types are first re-set to coarse soil. ice types are then located on the basis of glacier. note that a distinct ice type is used only if soil_to_use='variable'; this is in contrast to the analogous treatment of vegetation types.


  3. update_land_properties_fast

    subroutine update_land_properties_fast (snowmass, t_sfc, land, albedo, cover_type)
    
    !-----------------------------------------------------------------------
    !
    ! INPUT
    !    snowmass     = mass of snow on the ground (in kg/(m**2))
    !    t_sfc        = surface temperature (in degrees kelvin)
    !    land         = logical land mask
    ! 
    !  OUTPUT
    !    albedo       = surface albedo
    
    real,    intent(in),  dimension(:,:,:) :: snowmass, t_sfc
    logical, intent(in) , dimension(:,:,:) :: land
    real,    intent(out), dimension(:,:,:) :: albedo
    integer, intent(in),  dimension(:,:,:) :: cover_type
    !-----------------------------------------------------------------------
    call update_land_properties_fast (snowmass, t_sfc, land, albedo)
    DESCRIPTION
    Updates the rapidly changing parameters. Computes the albedo of hypothetical no-snow and deep-snow surfaces and uses snow mass to blend snow-free and deep-snow albedo values.


  4. regrid_discrete_field

    subroutine regrid_discrete_field (data_in, wb_in, sb_in, dlon_in, dlat_in, &
         lon_out, lat_out, ntype, &   
         mask_out, data_out, mask_in)
    
    !-----------------------------------------------------------------------
    !  input:
    !  -----
    !     data_in     input data; dimensioned by mdim x ndim
    !                      stored from south to north
    !     wb_in      longitude corresponding to western boundary of box i=1
    !     sb_in      latitude corresponding to southern boundary of box j=1
    !     dlon_in    x axis grid spacing in degrees of longitude
    !     dlat_in    y axis grid spacing in degrees of latitude
    !
    !     lon_out   longitudes of output data at grid box boundaries
    !                  dimensioned by size(data_out,1)+1
    !     lat_out   latitudes of output data at grid box boundaries
    !                  dimensioned by size(data_out,2)+1
    !     ntype     number of land cover types specified
    !     mask_out  output mask that specifies where the data are defined
    !
    !  output:
    !  ------
    !     data_out     output number of land cover type
    !
    !  optional
    !  --------
    !     mask_in   input mask;  =0.0 for data points that should not
    !               be used or have no data; has the same size as data_in
    !
    !-----------------------------------------------------------------------
      integer, intent(in)           :: ntype
      integer, intent(in)           :: data_in(:,:)
      real,    intent(in)           :: sb_in,wb_in, dlat_in, dlon_in
      real,    intent(in)           :: lon_out(:), lat_out(:)
      logical, intent(in)           :: mask_out(:,:)
      integer, intent(out)          :: data_out(:,:)
      real,    intent(in), optional :: mask_in(:,:)
    call regrid_discrete_field (data_in, wb_in, sb_in, dlon_in, dlat_in, & lon_out, lat_out, ntype, mask_out, data_out, mask_in)
    DESCRIPTION
    Regrids integer index data to any output grid from a uniformly spaced grid using a maximum-area voting scheme.


  5. typemax

    subroutine typemax(data,area,facis,facie,facjs,facje,ntype,ntypemax,enlarge)
    
      integer, intent(in)    :: data(:,:)
      real,    intent(in)    :: facis,facie,facjs,facje
      real,    intent(in)    :: area(:,:)
      integer, intent(in)    :: ntype   
      integer, intent(out)   :: ntypemax ! number of land cover type to be assigned
                                         ! to the entire grid cell; 
      logical, intent(inout) :: enlarge  ! says if it's necessary to repeat the
                                         ! process for a larger area
    call typemax (data,area,facis,facie,facjs,facje,ntype,ntypemax,enlarge)
    DESCRIPTION
    Calculation of total area of each land cover type within the territory and the determination of the type occupying the biggest area within the territory.


  6. init_land_properties_diag

    subroutine init_land_properties_diag (id_lon, id_lat, Time)
    
      integer,         intent(in) :: id_lon  ! ID of land longitude (X) axis  
      integer,         intent(in) :: id_lat  ! ID of land longitude (X) axis
      type(time_type), intent(in) :: Time    ! current time
    call init_land_properties_diag (id_lon, id_lat, Time)
    DESCRIPTION
    Initializes land properties diagnostics.


  7. diag_static

    subroutine diag_static ( Time,mask )
    
      type(time_type), intent(in) :: Time
      logical,         intent(in) :: mask(:,:,:)
    call diag_static ( Time,mask )
    DESCRIPTION
    Sends static fields to diagnostic output.


  8. land_properties_end

    subroutine land_properties_end()
    call land_properties_end ()
    DESCRIPTION
    Deallocates the land property data.



NAMELIST

&land_properties_nml

n_dim_ground_types
Size of ground (soil) parameter lookup tables
[integer, parameter, default: 11]
n_dim_cover_types
Size of cover (vegetation) parameter lookup tables
[integer, parameter, default: 14]
n_map_ground_types
Number of ground types in input map file
[integer, parameter, default: 10]
n_map_cover_types
Number of cover types in input map file
[integer, parameter, default: 11]
do_all_mcm
Run Manabe Climate Model land surface. Setting this global control option to TRUE causes specification all the following (regardless of default or input settings, which are then ignored): veg_to_use = 'cons_ssl' soil_to_use = 'cons_ssl' use_climap = .true. (this forced by veg_to_use='cons_ssl') use_climap_mcm = .true. do_mcm_masking = .true. use_single_geo = .true. geo_res_time = res_time_ssl factor_root = 1. factor_rough = 1. z_root_min = 0. max_snow = max_snow_ssl
[logical, default: .false.]
veg_to_use
Choice of method for defining vegetation. 'variable' - use input map to index vegetation parameter vectors 'constant' - use veg_index_constant to index veg parameter vectors 'cons_tun' - use tuned global constant vegetation 'cons_ssl' - use Manabe Climate Model-like vegetation (forces use_climap to be true)
[character*8, default: 'variable']
soil_to_use
Choice of method for defining soil. 'variable' - use input map to index soil parameter vectors 'constant' - use soil_index_constant to index soil parameter vectors 'cons_ssl' - use Manabe Climate Model-like soil
[character*8, default: 'variable']
use_glaciers
False to remove glaciers from land
[logical, default: .true.]
use_climap
True to override default albedo by CLIMAP and to invoke use of CLIMAP to define glacier locations (if use_glaciers)
[logical, default: .false.]
use_desert_albedo_map
true to override default snow-free albedo of desert only by albedo map (SRB)
[logical, default: .false.]
use_climap_mcm
Run Manabe Climate Model land surface
[logical, default: .false.]
do_mcm_masking
True to use Manabe Climate Model snow-albedo function
[logical, default: .false.]
use_single_basin
True to avoid using basin maps
[logical, default: .false.]
use_single_geo
True for global constant groundwater residence time
[logical, default: .false.]
i_dest0
If use_single_geo is set to .true., all the river discharge is put in a single grid cell. i_dest0 is the longitude index of this grid cell.
[integer, default: 1]
j_dest0
If use_single_geo is set to .true., all the river discharge is put in a single grid cell. j_dest0 is the latitude index of this grid cell.
[integer, default: 1]
veg_index_constant
Veg index used when veg_to_use='constant'
[integer, default: 3]
soil_index_constant
Soil index used when soil_to_use='constant'
[integer, default: 2]
soil_index_ice_substitute
Ground type to be substituted for ice ground type when such type is over-ruled due to absence of glacier cover type. if this is set to zero, then the ground type is temporarily marked as ocean, and, if land is present, ground type will then be assigned based on neighbor cells through regrid_discrete_field.
[integer, default: 1]
geo_res_time
Time constant when use_single_geo is true
[real, units: s, default: 60.*86400.]
t_range
Temperature range over which snow/glacier albedo varies
[real, units: K, default: 10.0]
factor_root
Global factor for critical_root_density
[real, default: 1.0]
factor_stomata
Global factor for veg_rs_min_vec
[real, default: 1.0]
factor_rough
Global factor for rough_momentum_vec
[real, default: 1.0]
z_root_min
lower bound for root-zone depth
[real, units: m, default: 0.01]
max_snow
Value of snow above which 'snow runoff' occurs
[real, units: kg/m3, default: 1000.]
sfc_heat_factor
"fudge" factor for heat capacity and thermal conductivity in surface soil layers
[real, default: 1.]
num_sfc_layers
number of surface layers for sfc_heat_factor
[integer, default: 0]
dynamic_cover_type
Set to true if cover type forcing data varies with time.
[logical, default: true]
read_old_ascii_cover
Set to true if reading the original ASCII static cover type forcing data
[logical, default: false]
cover_dataset_init_year
The initial year in the cover_type dataset.
[integer, default: 1860]
cover_dataset_entry
Beginning time for reading the cover_type dataset (yr,mo,dy,hr,mn,sc).
[integer, default: (/1,1,1,0,0,0/)]
veg_rs_min_vec
Minimum bulk stomatal resistance. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types, units: s/m]
veg_zeta_vec
Depth scale of root distribution. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types, units: m]
veg_root_mass_vec
Root biomass areal density. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types, units: kg/m2]
rough_momentum_vec
Roughness length for momentum. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types, units: m]
k_over_B_vec
ln (z_0_momentum / z_0_scalar). For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types]
crit_snowmass_vec
Snow amount that half hides surface. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types, units: kg/m3]
min_nosnow_alb_vec
Snow-free albedo at freezing point. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types]
max_nosnow_alb_vec
Snow-free albedo at t_range below freezing. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types]
min_snow_alb_vec
Snow albedo at freezing point. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types]
max_snow_alb_vec
Snow albedo at t_range below freezing. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_cover_types]
soil_awc_vec
Available water capacity. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_ground_types, units: kg/m3]
soil_therm_cap_vec
Volumetric heat capacity. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_ground_types, units: J/(K m3)]
soil_therm_dif_vec
Thermal diffusivity. For default values, refer to the table in the Public Code section below.
[real, dimensionn_dim_ground_types, units: m2/s]
use_topo_rough
If true, the topographic momentum drag scaling scheme is used
[logical, default: false]
max_topo_rough
Maximum of topographic "roughness length" used for momentum drag scaling
[real, units: m, default: 100]
topo_rough_factor
Scaling factor to convert topography variance to topographic "roughness length"
[real, default: 1.0]
topo_rough_source
Source of the sub-grid topography variance data for topographic momentum drag scaling. 'computed' means that the variance is calculated based on high-resolution topography data. 'input' means that the data will be provided in specified file (NetCDF of IEEE binary)
[caharacter(len=16), default: 'computed']
topo_rough_file
Name of the file to be used as an input for sub-grid topography variance data. The file can be either NetCDF (in this case variable name can also be specified), or IEEE.
[character(len=256), default: INPUT/mg_drag.data.nc]
topo_rough_var
Name of the NetCDF variable to be used as a topography variance field. Ignored if the file specified in topo_rough_file is not NetCDF file.
[character(len=128), default: ghprime]


DIAGNOSTIC FIELDS

Diagnostic fields may be output to a netcdf file by specifying the module name identifier and the desired field names (given below) in file diag_table. See the documentation for diag_manager.
Diagnostic fields for module name identifier: 
field name   
----------
albedo_max_no_snow albedo_min_no_snow cover_type ground_type
field description (units)
-------------------------
Maximum snow-free land albedo (dimensionless) Minimum snow-free land albedo (dimensionless) Land surface cover type (dimensionless) Land surface ground type (dimensionless)

DATA SETS

None.


PUBLIC CODE

From module land_properties_mod:
! the following namelist vectors contain properties indexed by cover (veg) type:
!  0      ocean
!  1 (BE) broadleaf evergreen trees
!  2 (BD) broadleaf deciduous trees
!  3 (BN) broadleaf/needleleaf trees
!  4 (NE) needleleaf evergreen trees
!  5 (ND) needleleaf deciduous trees
!  6 (G)  grassland
!  7 (D)  desert
!  8 (T)  tundra
!  9 (A)  agriculture
! 10 (I)  ice
! 11 (L)  lake
! 12 (TV) tuned global vegetation
! 13 (SV) Manabe Climate Model-like vegetation
! 14 (SI) Manabe Climate Model-like ice/glacier

! veg_rs_min_vec       minimum bulk stomatal resistance           s/m
! veg_zeta_vec         depth scale of root distribution            m
! veg_root_mass_vec    root biomass areal density               kg/m**2
! rough_momentum_vec   roughness length for momentum               m
! k_over_B_vec         ln (z_0_momentum / z_0_scalar)              -
! crit_snowmass_vec    snow amount that half hides surface      kg/m**3
! min_nosnow_alb_vec   snow-free albedo at freezing point          -
! max_nosnow_alb_vec   snow-free albedo at t_range below freezing       -
! min_snow_alb_vec     snow albedo at freezing point               -
! max_snow_alb_vec     snow albedo at t_range below freezing       -

real, dimension(n_dim_cover_types) :: &
!                      BE     BD     BN     NE     ND      G      D      T      A      I      L     TV     SV     SI
veg_rs_min_vec    =(/  43.6,  131., 87.1,  69.7,  218.,  56.6,  .01,   170.,  56.6, .01,   .01,     67.,  .01,   .01/),& 
veg_zeta_vec      =(/  .26,   .29,  .35,   .17,   .17,   .26,   .35,   .11,   .25,   0.0,   1.0,   .35,   .35,   0.0/),&
veg_root_mass_vec =(/  4.9,   4.2,  4.3,   2.9,   2.9,   1.4,  .762,   1.2,   .15,   0.0,   1.0,  .362,  .762,   0.0/),&
rough_momentum_vec=(/ 2.65,  .90,   1.2,   .90,   .80,   .07,   .01,   .07,   .40,   .01, 1.4e-4,  1.0,  .045,  .045/),&
k_over_B_vec      =(/   2.,    2.,    2.,    2.,    2.,   2.,    2.,    2.,    2.,    2.,  0.25,    2.,    0.,    0. /),&
crit_snowmass_vec =(/  60.,   10.,   25.,   40.,   40.,   5.,    5.,    5.,    5.,    5.,    5.,  100.,    5.,    5. /),&
min_nosnow_alb_vec=(/0.149, 0.130, 0.132, 0.126, 0.143, 0.182, 0.333, 0.139, 0.160, 0.650, 0.06,  0.12,   999.,  0.55/),&
max_nosnow_alb_vec=(/0.149, 0.130, 0.132, 0.126, 0.143, 0.182, 0.333, 0.139, 0.160, 0.800, 0.06,  0.12,   999.,  0.65/),&
min_snow_alb_vec  =(/0.650, 0.650, 0.650, 0.650, 0.650, 0.650, 0.650, 0.650, 0.650, 0.650, 0.06,  0.450, 0.450, 0.650/),&
max_snow_alb_vec  =(/0.800, 0.800, 0.800, 0.800, 0.800, 0.800, 0.800, 0.800, 0.800, 0.800, 0.06,  0.600, 0.600, 0.800/)
!                      BE     BD     BN     NE     ND      G      D      T      A      I      L     TV     SV     SI


! the following vectors contain properties indexed by ground (soil) type:
!  0       ocean
!  1 (C)   coarse soil
!  2 (M)   medium soil
!  3 (F)   fine soil
!  4 (CM)  coarse/medium mix
!  5 (CF)  coarse/fine mix
!  6 (MF)  medium/fine mix
!  7 (CMF) coarse/medium/fine mix
!  8 (P)   organic soil (peat)
!  9 (I)   ice
! 10 (L)   lake
! 11 (MCM)  Manabe Climate Model

! soil_awc_vec         available water capacity                 kg/m**3
! soil_therm_cap_vec   volumetric heat capacity                J/(K m**3)
! soil_therm_dif_vec   thermal diffusivity                       m**2/s

real, dimension(n_dim_ground_types) :: &
!   C      M      F      CM     CF     MF    CMF     P      I      L      MCM
soil_awc_vec      = &
(/   63.,  132.,  109.,   98.,   86.,  120.,  101.,  445., 1000., 1000.,  150./),&
soil_therm_cap_vec= &
(/ 1.8e6, 2.0e6, 2.6e6, 1.9e6, 2.2e6, 2.3e6, 2.1e6, 3.0e6, 1.6e6, 8.4e7, 1.0/),&
soil_therm_dif_vec=&
(/8.3e-7,4.0e-7,5.2e-7,6.2e-7,6.8e-7,4.6e-7,5.8e-7,1.3e-7,1.1e-6, 1.0,  2.0e-7/)
!   C      M      F      CM     CF     MF    CMF     P      I      L      MCM


ERROR MESSAGES

FATAL in land_properties_init
Cannot find file INPUT/cover_type_field.nc
The cover type field file cannot be found. Provide this file or set up namelist parameters so it is not necessary. To do the latter, set veg_to_use to something other than 'variable' in the namelist land_properties_nml.
FATAL in land_properties_init
must set cover_dataset_entry when using dynamic cover type inputs
When specifying dynamic cover type forcing data inputs, the cover_dataset_entry time must be set.
NOTE in land_properties_init
Using the static ASCII cover type dataset.
Using the read_old_ascii_cover option. Reading the ASCII cover type dataset.
NOTE in land_properties_init
Using the static NetCDF cover type dataset.
Using the static NetCDF cover type dataset.
FATAL in land_properties_init
must set cover_dataset_entry when using time-varying cover type inputs
When specifying static_cover_type_netcdf forcing data inputs, the cover_dataset_entry time must be set.
NOTE in land_properties_init
Cannot find the netCDF file INPUT/cover_type_field. Using the ASCII file.
The netCDF cover type field file cannot be found. Using the ASCII file.
FATAL in land_properties_init
Cannot find file INPUT/ground_type_field
The ground (soil) type field file cannot be found. Provide this file or set up namelist parameters so it is not necessary. To do the latter, set soil_to_use to something other than 'variable' in the namelist land_properties_nml.
FATAL in land_properties_init
Cannot find file INPUT/groundwater_residence_time_field
The groundwater residence time field file cannot be found. Provide this file or set up namelist parameters so it is not necessary. To do the latter, set use_single_geo to .true. in the namelist land_properties_nml.
FATAL in land_properties_init
could not read topography data
get_topog_stdev failed to provide topography variance data.
FATAL in land_properties_init
input file for topography standard deviation ... does not exist
topo_rough_source is set to 'input', but input file name either not specified or specified incorrectly, so the program cannot find it.
FATAL in land_properties_init
... is not a valid value for topo_rough_source
specified value of namelist parameter topo_rough_source is invalid; valid values are 'computed' or 'input'.
FATAL in update_land_properties_slow
Cannot find file INPUT/cover_type_field.nc
The cover type field file cannot be found. Provide this file or set up namelist parameters so it is not necessary. To do the latter, set veg_to_use to something other than 'variable' in the namelist land_properties_nml.
FATAL in update_land_properties_slow
Cannot find file INPUT/ground_type_field
The ground (soil) type field file cannot be found. Provide this file or set up namelist parameters so it is not necessary. To do the latter, set soil_to_use to something other than 'variable' in the namelist land_properties_nml.
FATAL in update_land_properties_slow
Cannot find file INPUT/groundwater_residence_time_field
The groundwater residence time field file cannot be found. Provide this file or set up namelist parameters so it is not necessary. To do the latter, set use_single_geo to .true. in the namelist land_properties_nml.
FATAL in update_land_properties_slow
could not read topography data
get_topog_stdev failed to provide topography variance data.
FATAL in update_land_properties_slow
input file for topography standard deviation ... does not exist
topo_rough_source is set to 'input', but input file name either not specified or specified incorrectly, so the program cannot find it.
FATAL in update_land_properties_slow
... is not a valid value for topo_rough_source
specified value of namelist parameter topo_rough_source is invalid; valid values are 'computed' or 'input'.
FATAL in regrid_discrete_field
inner dimension for input data is too small.


top