Skip to content

Commit

Permalink
Turn off vegn_pheno for layer 1 of grasses
Browse files Browse the repository at this point in the history
  • Loading branch information
Laura Marques committed Apr 20, 2024
1 parent 39ba10b commit c49db83
Show file tree
Hide file tree
Showing 2 changed files with 23 additions and 15 deletions.
14 changes: 7 additions & 7 deletions data-raw/generate_biomee_driver_data_DBEN.R
Original file line number Diff line number Diff line change
Expand Up @@ -159,13 +159,13 @@ params_soil <- tibble(
init_cohort <- tibble(
init_n_cohorts = 1, # number of PFTs: 1,2,3,4,...
init_cohort_species = seq(1, 10), # indicates sps # 1 - Fagus sylvatica
init_cohort_nindivs = 0.05, # initial individual density, individual/m2 ! 1 indiv/m2 = 10.000 indiv/ha
init_cohort_bl = 0.0, # initial biomass of leaves, kg C/individual
init_cohort_br = 0.0, # initial biomass of fine roots, kg C/individual
init_cohort_bsw = 0.05, # initial biomass of sapwood, kg C/individual
init_cohort_bHW = 0.0, # initial biomass of heartwood, kg C/tree
init_cohort_seedC = 0.0, # initial biomass of seeds, kg C/individual
init_cohort_nsc = 0.05 # initial non-structural biomass
init_cohort_nindivs = 0.05,
init_cohort_bl = 0.0,
init_cohort_br = 0.0,
init_cohort_bsw = 0.05,
init_cohort_bHW = 0.0,
init_cohort_seedC = 0.0,
init_cohort_nsc = 0.05
)

init_soil <- tibble( #list
Expand Down
24 changes: 16 additions & 8 deletions src/vegetation_biomee.mod.f90
Original file line number Diff line number Diff line change
Expand Up @@ -490,9 +490,10 @@ subroutine vegn_phenology( vegn )
integer :: i
! real :: grassdensity ! for grasses only
! real :: BL_u,BL_c
integer :: GrassMaxL = 3
real :: ccNSC, ccNSN
logical :: cc_firstday = .false.
logical :: TURN_ON_life = .false., TURN_OFF_life
logical :: cc_firstday != .false.
logical :: TURN_ON_life, TURN_OFF_life

vegn%litter = 0 ! daily litter

Expand All @@ -513,12 +514,19 @@ subroutine vegn_phenology( vegn )
if (sp%phenotype==1 .and. cc%status==LEAF_OFF) cc%status=LEAF_ON

! for deciduous and grasses
TURN_ON_life = (sp%phenotype == 0 .and. &
cc%status == LEAF_OFF .and. &
cc%gdd > sp%gdd_crit .and. &
vegn%tc_pheno > sp%tc_crit_on) .and. &
(sp%lifeform .ne. 0 .OR.(sp%lifeform .eq. 0 .and. cc%layer==1))

!TURN_ON_life = (sp%phenotype == 0 .and. &
! cc%status == LEAF_OFF .and. &
! cc%gdd > sp%gdd_crit .and. &
! vegn%tc_pheno > sp%tc_crit_on) .and. &
! (sp%lifeform .ne. 0 .OR.(sp%lifeform .eq. 0 .and. cc%layer==1))

TURN_ON_life = ((sp%phenotype==0 .and. cc%status/=LEAF_ON) &
.and.(cc%gdd>sp%gdd_crit .and. vegn%tc_pheno>sp%tc_crit_on) & ! Thermal conditions
!.and.(vegn%thetaS>sp%betaON .and. cc%Ndm>Days_thld) & ! Water
.and.(vegn%thetaS>sp%betaON) & ! Water
.and.(.NOT.(sp%lifeform==0 .and. cc%layer > GrassMaxL)) & ! If grasses, layer< 3
)

cc_firstday = .false.
if (TURN_ON_life) then
cc%status = LEAF_ON ! Turn on a growing season
Expand Down

0 comments on commit c49db83

Please sign in to comment.