source: tags/ORCHIDEE_4_1/ORCHIDEE/src_parameters/vertical_soil_var.f90 @ 7852

Last change on this file since 7852 was 7149, checked in by sebastiaan.luyssaert, 3 years ago

Consistent root profiles throughout the code. Contributes to ticket #715

  • Property svn:keywords set to Date Revision HeadURL
File size: 2.5 KB
Line 
1! =================================================================================================================================
2! MODULE       : vertical_soil_var
3!
4! CONTACT      : orchidee-help _at_ listes.ipsl.fr
5!
6! LICENCE      : IPSL (2006)
7! This software is governed by the CeCILL licence see ORCHIDEE/ORCHIDEE_CeCILL.LIC
8!
9!>\BRIEF       
10!!
11!!\n DESCRIPTION:
12!!               
13!! RECENT CHANGE(S):
14!!
15!! REFERENCE(S) :
16!!
17!! SVN          :
18!! $HeadURL$
19!! $Date$
20!! $Revision$
21!! \n
22!_ ================================================================================================================================
23
24MODULE vertical_soil_var
25
26  USE defprec
27
28  IMPLICIT NONE
29  PUBLIC
30
31  !! Dimensioning parameters
32  INTEGER(i_std), SAVE      :: ngrnd     !! Number of soil layer for thermo (unitless)
33!$OMP THREADPRIVATE(ngrnd)
34  INTEGER(i_std), SAVE      :: nslm      !! Number of levels in CWRR (unitless)
35!$OMP THREADPRIVATE(nslm)
36  REAL(r_std), SAVE         :: zmaxh     !! Maximum depth of soil reservoir in hydrol (m). Old name dpu_max or depth_Wmax
37!$OMP THREADPRIVATE(zmaxh)
38  REAL(r_std), SAVE         :: zmaxt     !! Maximum depth of the soil thermodynamics (m)
39!$OMP THREADPRIVATE(zmaxt)
40  INTEGER(i_std), SAVE      :: grnd_80   !! Index of soil depth closet to 80 cm below ground
41!$OMP THREADPRIVATE(grnd_80)
42
43  !! Variables defining the vertical layering in soil moisture and temperature
44  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: znt          !! Depth of nodes for thermal (m)
45!$OMP THREADPRIVATE(znt)
46  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: znh          !! Depth of nodes for hydrology (m)
47!$OMP THREADPRIVATE(znh)
48  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: dnh          !! Distance between the current node and the one above for hydrology (m)
49!$OMP THREADPRIVATE(dnh)
50  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: dlh          !! Soil layer thickness for hydrology (m)
51!$OMP THREADPRIVATE(dlh)
52  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: dlt          !! Soil layer thickness for thermal (m)
53!$OMP THREADPRIVATE(dlt)
54  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: zlh          !! Depth of lower layer-interface for hydrology (m)
55!$OMP THREADPRIVATE(zlh)
56  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: zlt          !! Depth of lower layer-interface for thermal (m)
57!$OMP THREADPRIVATE(zlt)
58  REAL(r_std), SAVE, ALLOCATABLE, DIMENSION(:) :: zdr          !! Depth of layer-interfaces following De Rosnay 1999 and used in the calculation of root profiles (m)
59!$OMP THREADPRIVATE(zdr)
60
61END MODULE vertical_soil_var
Note: See TracBrowser for help on using the repository browser.