LMDZ
vlspltgen_mod.F90
Go to the documentation of this file.
2 
3  REAL,POINTER,SAVE :: qsat(:,:)
4  REAL,POINTER,SAVE :: mu(:,:) ! CRisi: on ajoute une dimension
5  REAL,POINTER,SAVE :: mv(:,:)
6  REAL,POINTER,SAVE :: mw(:,:,:)
7  REAL,POINTER,SAVE :: zm(:,:,:)
8  REAL,POINTER,SAVE :: zq(:,:,:)
9 
10 CONTAINS
11 
12  SUBROUTINE vlspltgen_allocate
13  USE bands
15  USE parallel_lmdz
16  USE infotrac
17  USE vlz_mod,ONLY : vlz_allocate
18  IMPLICIT NONE
19  include "dimensions.h"
20  include "paramet.h"
21  TYPE(distrib),POINTER :: d
22 
24  CALL allocate_u(qsat,llm,d)
25  CALL allocate_u(mu,llm,d)
26  CALL allocate_v(mv,llm,d)
27  CALL allocate_u(mw,llm+1,nqtot,d)
28  CALL allocate_u(zm,llm,nqtot,d)
29  CALL allocate_u(zq,llm,nqtot,d)
30 
31  CALL vlz_allocate
32 
33  END SUBROUTINE vlspltgen_allocate
34 
35  SUBROUTINE vlspltgen_switch_vanleer(dist)
37  USE bands
38  USE parallel_lmdz
39  USE vlz_mod,ONLY : vlz_switch_vanleer
40  IMPLICIT NONE
41  TYPE(distrib),INTENT(IN) :: dist
42 
43  CALL switch_u(qsat,distrib_vanleer,dist)
44  CALL switch_u(mu,distrib_vanleer,dist)
45  CALL switch_u(mv,distrib_vanleer,dist)
46  CALL switch_u(mw,distrib_vanleer,dist)
47  CALL switch_u(zm,distrib_vanleer,dist)
48  CALL switch_u(zq,distrib_vanleer,dist)
49 
50  CALL vlz_switch_vanleer(dist)
51 
52  END SUBROUTINE vlspltgen_switch_vanleer
53 
54 END MODULE vlspltgen_mod
Definition: bands.F90:4
subroutine vlz_switch_vanleer(dist)
Definition: vlz_mod.F90:35
subroutine vlspltgen_switch_vanleer(dist)
!$Id Turb_fcg_gcssold get_uvd hqturb_gcssold endif!large scale llm day day1 day day1 *dt_toga endif!time annee_ref dt_toga u_toga vq_toga w_prof vq_prof llm day day1 day day1 *dt_dice endif!time annee_ref dt_dice swup_dice vg_dice omega_dice tg_prof vg_profd w_profd omega_profd!do llm!print llm l llm
real, dimension(:,:,:), pointer, save zm
integer, save nqtot
Definition: infotrac.F90:6
subroutine vlz_allocate
Definition: vlz_mod.F90:14
type(distrib), target, save distrib_vanleer
Definition: bands.F90:18
real, dimension(:,:), pointer, save qsat
!$Id mode_top_bound COMMON comconstr omeg dissip_zref ihf INTEGER lcl REAL dtvr!dynamical time mu
Definition: comconst.h:31
real, dimension(:,:,:), pointer, save zq
real, dimension(:,:,:), pointer, save mw
real, dimension(:,:), pointer, save mv
subroutine vlspltgen_allocate