source: trunk/LMDZ.MARS/libf/phymars/compute_dtau_mod.F90 @ 3393

Last change on this file since 3393 was 2932, checked in by romain.vande, 20 months ago

Mars PCM:
Add a new routine to write output called write_output.
It needs to be imported (for example : use write_output_mod, only: write_output)
Then, it requires only 4 arguments : the name of the variable, its title, its units and the variable itself.
It detects the dimension of the variable and decide to output either in diagfi or diagsoil.
It is also compatible with XIOS (xml file needs to be adapted)
Writediagfi and writediagsoil routines are still available in case.
RV

File size: 5.3 KB
RevLine 
[2265]1       MODULE compute_dtau_mod
[1974]2
[2265]3        IMPLICIT NONE
[1974]4
[2265]5        REAL,SAVE :: ti_injection_sol ! time of beginning injection
6        REAL,SAVE :: tf_injection_sol ! time of end injection
[2160]7
[2265]8        REAL,SAVE,ALLOCATABLE :: dtau(:) ! Dust opacity difference (at 610Pa)
9                                         ! between GCM and dust scenario
[2616]10                                         
11!$OMP THREADPRIVATE(ti_injection_sol,tf_injection_sol,dtau)
[1974]12
[2265]13       CONTAINS
[1974]14
[2265]15        SUBROUTINE compute_dtau(ngrid,nlayer,                           &
[2415]16                                 zday,pplev,tau_pref_gcm,               &
[2643]17                                 ptimestep,local_time,IRtoVIScoef,      &
18                                 dustliftday)
[2265]19
20        USE geometry_mod, only: longitude_deg
[1974]21        USE time_phylmdz_mod, only: dtphys, daysec
22        USE comcstfi_h, only: g
23        USE tracer_mod, only: alpha_lift,igcm_dust_mass,igcm_dust_number
[2265]24        USE dimradmars_mod, only: tauvis
[2417]25        USE dust_param_mod, only: odpref, t_scenario_sol
[2643]26        USE read_dust_scenario_mod, only: read_dust_scenario
[2932]27        use write_output_mod, only: write_output
[1974]28       
[2265]29        IMPLICIT NONE
30       
[1974]31        include "callkeys.h"
[2265]32       
[1974]33        INTEGER, INTENT(in) :: ngrid
[2265]34        INTEGER, INTENT(in) :: nlayer
[1974]35        REAL, INTENT(in) :: zday ! date at lon=0, in fraction of sols
[2265]36        REAL, INTENT(in) :: pplev(ngrid,nlayer+1) ! pressure (Pa)
[2415]37        REAL, INTENT(in) :: tau_pref_gcm(ngrid) ! Visible dust opacity column
38                            ! at 610Pa as computed in the GCM
[2265]39        REAL, INTENT(in) :: ptimestep
[1974]40        REAL, INTENT(in) :: local_time(ngrid)
[2643]41        REAL, INTENT(in) :: IRtoVIScoef(ngrid) ! conversion coefficient to apply on
42                                               ! scenario absorption IR (9.3um) CDOD
43                                               ! = tau_pref_gcm_VIS / tau_pref_gcm_IR
[1974]44        REAL, INTENT(out) :: dustliftday(ngrid) ! Dust injection rate (s-1)
45       
46        INTEGER :: ig, l
[2265]47        INTEGER, SAVE :: nb_daystep ! nomber of step a day
[2415]48        REAL :: tau_pref_target(ngrid) ! dust opacity column at odpref=610 Pa
49                ! as extracted from dust scenario
[1974]50        REAL :: zday_scenario
51        REAL,ALLOCATABLE,SAVE :: local_time_prev(:)
52       
53        LOGICAL, SAVE :: firstcall=.TRUE. ! signals first call to physics
54       
[2616]55!$OMP THREADPRIVATE(nb_daystep,local_time_prev,firstcall)
[1974]56       
[2616]57       
[1974]58        IF(firstcall)THEN
59                ALLOCATE(local_time_prev(ngrid))
60                DO ig=1,ngrid
61                   local_time_prev(ig)=modulo(1.+(zday-ptimestep/daysec)&
[2265]62                                      -INT(zday-ptimestep/daysec)       &
[1974]63                                      +(longitude_deg(ig)/15)/24,1.)
64                ENDDO
65                nb_daystep=(daysec/dtphys)
[2160]66                ! Local time in sol fraction
67                ti_injection_sol=ti_injection/24.
68                tf_injection_sol=tf_injection/24.
[1974]69                firstcall=.FALSE.
70        ENDIF
71       
[2415]72        ! 1. Obtain tau_pref_target from dust scenario at zday+1
[2265]73        if (iaervar.eq.1) then
[2415]74          tau_pref_target = tauvis
[2265]75        else
76          zday_scenario=zday-modulo(zday,1.) ! integer value of the day: the scenario opacity is measured at 14:00
[2166]77          zday_scenario=zday_scenario+1      ! opacity of the dust scenario is read the day after
[2265]78          call read_dust_scenario(ngrid,nlayer,zday_scenario,pplev,     &
[2643]79                                         IRtoVIScoef,                   &
[2415]80                                         tau_pref_target)
[2166]81        endif
[1985]82       ! for diagnostics
[2932]83        call write_output("tau_pref_target", &
[2415]84                          "target visible dust opacity column at 610Pa", &
[2932]85                          "",tau_pref_target(:))
[1974]86
[2265]87        ! 2. Compute dtau() and dustliftday()
88        DO ig=1,ngrid
89         IF ((local_time(ig).ge.t_scenario_sol).and.                    &
90                 (local_time_prev(ig).lt.(t_scenario_sol)))THEN
[2415]91                 dtau(ig)=tau_pref_target(ig)-tau_pref_gcm(ig)
[1974]92         ENDIF
[2265]93
[2415]94        ! Use dtau (when positive) to compute dustliftday
[1974]95         IF (dtau(ig).LT.0) THEN
[2265]96             dustliftday(ig)=0.
97         ELSE
98             dustliftday(ig)=coeff_injection*                           &
99                        (dtau(ig)*pplev(ig,1)/odpref)                   &
100                        /(daysec*(tf_injection_sol-ti_injection_sol))
[1974]101         ENDIF
[2265]102        ENDDO ! of DO ig=1,ngrid
103
104       ! for diagnostics
[2932]105        call write_output("dtau","opacity difference wrt scenario",&
106                          "",dtau(:))
107        call write_output("dustliftday","dust injection rate",     &
108                          "s-1",dustliftday(:))
[1974]109         
110        ! 4. Save local time
111        local_time_prev(1:ngrid)=local_time(1:ngrid)
112       
113        end subroutine compute_dtau
114
[2265]115!=======================================================================
116! Initialization of the module variables
117
118        subroutine ini_compute_dtau_mod(ngrid)
119       
120          implicit none
121       
122          integer, intent(in) :: ngrid
123       
124          allocate(dtau(ngrid))
125       
126        end subroutine ini_compute_dtau_mod
127       
128        subroutine end_compute_dtau_mod
129       
130          implicit none
131       
132          if (allocated(dtau)) deallocate(dtau)
133
134          end subroutine end_compute_dtau_mod       
135
136       END MODULE compute_dtau_mod
Note: See TracBrowser for help on using the repository browser.