LMDZ
VARtSV.F90
Go to the documentation of this file.
1 MODULE vartsv
2 
3 USE var_sv, only : nsol, nsno, klonv
4 
5 IMPLICIT NONE
6 ! +
7  INTEGER, PARAMETER :: ntaver = 4
8 ! +
9  REAL,ALLOCATABLE,SAVE :: toicsv(:) ! Snow to ice balance
10 !$OMP THREADPRIVATE(toicSV)
11 
12  REAL,ALLOCATABLE,SAVE :: dz1_sv(:,:) ! "inverse" layer thicknes
13 !$OMP THREADPRIVATE(dz1_SV)
14  REAL,ALLOCATABLE,SAVE :: dz2_sv(:,:) ! layer thickness
15 !$OMP THREADPRIVATE(dz2_SV)
16  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: tsf_sv ! surface temperature !hj12032010
17 !$OMP THREADPRIVATE(Tsf_SV)
18  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: tsfnsv ! new surface temperature
19 !$OMP THREADPRIVATE(TsfnSV)
20  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: acohsv, bcohsv ! coefficients for Enthalpy
21 !$OMP THREADPRIVATE(AcoHSV, BcoHSV) ! evolution,from atmosphere
22  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: acoqsv, bcoqsv ! coefficients for Humidity
23 !$OMP THREADPRIVATE( AcoQSV, BcoQSV) ! evolution,from atmosphere
24  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: ps__sv ! surface pressure
25 !$OMP THREADPRIVATE(ps__SV)
26  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: p1l_sv ! 1st layer pressure
27 !$OMP THREADPRIVATE(p1l_SV)
28  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: cdh_sv ! drag coeff Energy (?)
29 !$OMP THREADPRIVATE(cdH_SV)
30  REAL, DIMENSION(:),ALLOCATABLE,SAVE :: rsolsv ! Radiation balance surface
31 !$OMP THREADPRIVATE(rsolSV)
32  REAL,SAVE :: lambsv ! coefficient soil layers
33 !$OMP THREADPRIVATE(lambSV)
34 
35  ! #AW
36  REAL, ALLOCATABLE,SAVE :: v__mem(:,:)
37 !$OMP THREADPRIVATE(V__mem) ! #AW
38  REAL, ALLOCATABLE,SAVE :: vvmmem(:)
39 !$OMP THREADPRIVATE(VVmmem) ! #AH
40  REAL, ALLOCATABLE,SAVE :: t__mem(:,:)
41 !$OMP THREADPRIVATE(T__mem) ! #AH
42  REAL, ALLOCATABLE,SAVE :: dtmmem(:)
43 !$OMP THREADPRIVATE(dTmmem)
44 
45 CONTAINS
46 
47  SUBROUTINE init_vartsv
48  IMPLICIT NONE
49 
50  ALLOCATE(toicsv(klonv))
51 
52  ALLOCATE(dz1_sv(klonv,-nsol:nsno)) ! "inverse" layer thicknes
53  ALLOCATE(dz2_sv(klonv,-nsol:nsno)) ! layer thickness
54  ALLOCATE(tsf_sv(klonv)) ! surface temperature !hj12032010
55  ALLOCATE(tsfnsv(klonv)) ! new surface temperature
56  ALLOCATE(acohsv(klonv), bcohsv(klonv)) ! coefficients for Enthalpy
57  ! evolution,from atmosphere
58  ALLOCATE(acoqsv(klonv), bcoqsv(klonv)) ! coefficients for Humidity
59  ! evolution,from atmosphere
60  ALLOCATE(ps__sv(klonv)) ! surface pressure
61  ALLOCATE(p1l_sv(klonv)) ! 1st layer pressure
62  ALLOCATE(cdh_sv(klonv)) ! drag coeff Energy (?)
63  ALLOCATE(rsolsv(klonv)) ! Radiation balance surface
64 
65  ! #AW
66  ALLOCATE(v__mem(klonv,ntaver)) ! #AW
67  ALLOCATE(vvmmem(klonv)) ! #AH
68  ALLOCATE(t__mem(klonv,ntaver)) ! #AH
69  ALLOCATE(dtmmem(klonv))
70  END SUBROUTINE init_vartsv
71 
72 END MODULE vartsv
73 
real, dimension(:,:), allocatable, save t__mem
Definition: VARtSV.F90:40
real, save lambsv
Definition: VARtSV.F90:32
real, dimension(:), allocatable, save bcohsv
Definition: VARtSV.F90:20
real, dimension(:), allocatable, save vvmmem
Definition: VARtSV.F90:38
real, dimension(:,:), allocatable, save dz1_sv
Definition: VARtSV.F90:12
Definition: VARtSV.F90:1
real, dimension(:), allocatable, save ps__sv
Definition: VARtSV.F90:24
real, dimension(:), allocatable, save p1l_sv
Definition: VARtSV.F90:26
real, dimension(:), allocatable, save rsolsv
Definition: VARtSV.F90:30
real, dimension(:), allocatable, save bcoqsv
Definition: VARtSV.F90:22
real, dimension(:), allocatable, save toicsv
Definition: VARtSV.F90:9
real, dimension(:), allocatable, save acoqsv
Definition: VARtSV.F90:22
real, dimension(:,:), allocatable, save dz2_sv
Definition: VARtSV.F90:14
Definition: VAR_SV.F90:1
real, dimension(:), allocatable, save acohsv
Definition: VARtSV.F90:20
integer, parameter nsno
Definition: VAR_SV.F90:11
real, dimension(:), allocatable, save tsf_sv
Definition: VARtSV.F90:16
real, dimension(:), allocatable, save dtmmem
Definition: VARtSV.F90:42
integer, parameter nsol
Definition: VAR_SV.F90:10
integer, save klonv
Definition: VAR_SV.F90:13
real, dimension(:), allocatable, save cdh_sv
Definition: VARtSV.F90:28
integer, parameter ntaver
Definition: VARtSV.F90:7
subroutine init_vartsv
Definition: VARtSV.F90:48
real, dimension(:), allocatable, save tsfnsv
Definition: VARtSV.F90:18
real, dimension(:,:), allocatable, save v__mem
Definition: VARtSV.F90:36