Ignore:
Timestamp:
Jul 30, 2019 2:47:10 PM (5 years ago)
Author:
suehring
Message:

Merge with branch resler: biomet- output of bio_mrt added; plant_canopy - separate vertical dimension for 3D output (to save disk space); radiation - remove unused plant canopy variables; urban-surface model - do not add anthropogenic heat during wall spin-up

File:
1 edited

Legend:

Unmodified
Added
Removed
  • palm/trunk/SOURCE/radiation_model_mod.f90

    r4089 r4127  
    2828! -----------------
    2929! $Id$
     30! Remove unused pch_index (merge from branch resler)
     31!
     32! 4089 2019-07-11 14:30:27Z suehring
    3033! - Correct level 2 initialization of spectral albedos in rrtmg branch, long- and
    3134!   shortwave albedos were mixed-up.
     
    61946197       USE control_parameters,                                                 &
    61956198           ONLY:  dz_stretch_level_start
    6196            
    6197        USE netcdf_data_input_mod,                                              &
    6198            ONLY:  leaf_area_density_f
    61996199
    62006200       USE plant_canopy_model_mod,                                             &
    6201            ONLY:  pch_index, lad_s
     6201           ONLY:  lad_s
    62026202
    62036203       IMPLICIT NONE
     
    62596259           nzutl = MAX( nzutl, MAXVAL( pct ) )
    62606260           nzptl = MAXVAL( pct )
    6261 !--        code of plant canopy model uses parameter pch_index
    6262 !--        we need to setup it here to right value
    6263 !--        (pch_index, lad_s and other arrays in PCM are defined flat)
    6264            pch_index = MERGE( leaf_area_density_f%nz - 1, MAXVAL( pch ),       &
    6265                               leaf_area_density_f%from_file )
    62666261
    62676262           prototype_lad = MAXVAL( lad_s ) * .9_wp  !< better be *1.0 if lad is either 0 or maxval(lad) everywhere
Note: See TracChangeset for help on using the changeset viewer.