source: codes/icosagcm/trunk/src/physics.f90 @ 146

Last change on this file since 146 was 99, checked in by ymipsl, 12 years ago

Output precipitation in dcmip physics

YM

File size: 1.3 KB
Line 
1MODULE physics_mod
2
3  CHARACTER(LEN=255) :: physics_type="none"
4
5
6CONTAINS
7
8  SUBROUTINE init_physics
9  USE icosa
10  USE physics_dcmip_mod, init_physics_dcmip=>init_physics
11  IMPLICIT NONE
12   
13    CALL getin("physics",physics_type)
14   
15    SELECT CASE(TRIM(physics_type))
16      CASE ('none')
17   
18      CASE ('dcmip')
19        CALL init_physics_dcmip
20     
21      CASE DEFAULT
22         PRINT*, 'Bad selector for variable physics <',physics_type, &
23              '> options are <none>, <dcmip>,'
24         STOP
25    END SELECT
26   
27  END SUBROUTINE init_physics
28
29  SUBROUTINE physics(it,f_phis, f_ps, f_theta_rhodz, f_ue, f_q)
30  USE icosa
31  USE physics_dcmip_mod, physics_dcmip=>physics
32  IMPLICIT NONE
33    INTEGER, INTENT(IN)   :: it
34    TYPE(t_field),POINTER :: f_phis(:)
35    TYPE(t_field),POINTER :: f_ps(:)
36    TYPE(t_field),POINTER :: f_theta_rhodz(:)
37    TYPE(t_field),POINTER :: f_ue(:)
38    TYPE(t_field),POINTER :: f_q(:)
39   
40    SELECT CASE(TRIM(physics_type))
41      CASE ('none')
42   
43      CASE ('dcmip')
44        CALL physics_dcmip(it, f_phis, f_ps, f_theta_rhodz, f_ue, f_q)
45     
46      CASE DEFAULT
47         PRINT*, 'Bad selector for variable physics <',physics_type, &
48              '> options are <none>, <dcmip>,'
49         STOP
50    END SELECT
51   
52  END SUBROUTINE physics
53
54END MODULE physics_mod
Note: See TracBrowser for help on using the repository browser.