1 | ! |
---|
2 | ! $Header: /home/cvsroot/LMDZ4/libf/phylmd/phytrac.F,v 1.16 2006/03/24 15:06:23 lmdzadmin Exp $ |
---|
3 | ! |
---|
4 | c |
---|
5 | c |
---|
6 | SUBROUTINE phytrac_emiss (timesimu, |
---|
7 | I debutphy, |
---|
8 | I lafin, |
---|
9 | I nqmax, |
---|
10 | I nlon, |
---|
11 | I nlev, |
---|
12 | I pdtphys, |
---|
13 | I paprs, |
---|
14 | I xlat,xlon, |
---|
15 | O tr_seri) |
---|
16 | |
---|
17 | c====================================================================== |
---|
18 | c Auteur(s) FH |
---|
19 | c Objet: Moniteur general des tendances traceurs |
---|
20 | c |
---|
21 | cAA Remarques en vrac: |
---|
22 | cAA-------------------- |
---|
23 | cAA 1/ le call phytrac se fait avec nqmax |
---|
24 | c |
---|
25 | c SL: Janvier 2014 |
---|
26 | c Version developed for surface emission |
---|
27 | c Maybe could be used just to compute the 'source' variable from physiq |
---|
28 | c |
---|
29 | c====================================================================== |
---|
30 | USE infotrac_phy, ONLY: nqtot |
---|
31 | use dimphy |
---|
32 | USE geometry_mod, only: cell_area |
---|
33 | USE chemparam_mod,only:M_tr |
---|
34 | USE mod_grid_phy_lmdz, ONLY: nbp_lon, nbp_lat |
---|
35 | IMPLICIT none |
---|
36 | #include "YOMCST.h" |
---|
37 | #include "clesphys.h" |
---|
38 | c====================================================================== |
---|
39 | |
---|
40 | c Arguments: |
---|
41 | |
---|
42 | c EN ENTREE: |
---|
43 | c ========== |
---|
44 | |
---|
45 | real timesimu ! duree depuis debut simu (s) |
---|
46 | logical debutphy ! le flag de l'initialisation de la physique |
---|
47 | logical lafin ! le flag de la fin de la physique |
---|
48 | integer nqmax ! nombre de traceurs auxquels on applique la physique |
---|
49 | integer nlon ! nombre de points horizontaux |
---|
50 | integer nlev ! nombre de couches verticales |
---|
51 | real pdtphys ! pas d'integration pour la physique (seconde) |
---|
52 | real paprs(nlon,nlev+1) ! pression pour chaque inter-couche (en Pa) |
---|
53 | REAL xlat(nlon) ! latitudes pour chaque point |
---|
54 | REAL xlon(nlon) ! longitudes pour chaque point |
---|
55 | |
---|
56 | c EN ENTREE/SORTIE: |
---|
57 | c ================= |
---|
58 | |
---|
59 | real tr_seri(nlon,nlev,nqmax) ! traceur |
---|
60 | |
---|
61 | cAA ---------------------------- |
---|
62 | cAA VARIABLES LOCALES TRACEURS |
---|
63 | cAA ---------------------------- |
---|
64 | |
---|
65 | c pour emission volcan |
---|
66 | real :: deltatr(klon,klev,nqtot) |
---|
67 | |
---|
68 | integer,parameter :: nblat=5,nblon=4,nbz=3 |
---|
69 | integer,parameter :: Nemiss=0 ! duree emission (Ed) |
---|
70 | integer,save :: Nheight(nbz) ! layer emission |
---|
71 | real,save :: so2_quantity ! quantity so2 (kg) |
---|
72 | real,save :: lat_volcan(nblat),lon_volcan(nblon) |
---|
73 | real,save :: area_emiss(nblat,nblon) |
---|
74 | integer,save :: ig_volcan(nblat,nblon) |
---|
75 | |
---|
76 | INTEGER i, k, it |
---|
77 | integer ilat,ilon,iz |
---|
78 | real deltalat,deltalon |
---|
79 | c====================================================================== |
---|
80 | |
---|
81 | c EMISSION TRACEURS |
---|
82 | |
---|
83 | c--------- |
---|
84 | c debutphy |
---|
85 | c--------- |
---|
86 | if (debutphy) then |
---|
87 | |
---|
88 | print*,"DEBUT PHYTRAC" |
---|
89 | print*,"PHYTRAC: EMISSION" |
---|
90 | |
---|
91 | ALLOCATE(M_tr(nqtot)) |
---|
92 | M_tr(:)=64. ! SO2 |
---|
93 | |
---|
94 | C========================================================================= |
---|
95 | c Caracteristiques des traceurs emis: |
---|
96 | C========================================================================= |
---|
97 | |
---|
98 | c nombre total de traceur |
---|
99 | if (nbz*nblat*nblon .gt. nqtot) then |
---|
100 | print*, nbz*nblat*nblon, nqtot |
---|
101 | write(*,*) "Attention, pas assez de traceurs" |
---|
102 | write(*,*) "le dernier sera bien le dernier" |
---|
103 | endif |
---|
104 | |
---|
105 | c quantite en kg |
---|
106 | so2_quantity = 20.*10.**9. |
---|
107 | |
---|
108 | c height (in layer index) |
---|
109 | Nheight(1) = 6 ! ~ 1 km |
---|
110 | Nheight(2) = 16 ! ~ 25 km |
---|
111 | Nheight(3) = 24 ! ~ 50 km |
---|
112 | |
---|
113 | c localisation volcan |
---|
114 | lat_volcan(1) = 70. |
---|
115 | lat_volcan(2) = 35. |
---|
116 | lat_volcan(3) = 0. |
---|
117 | lat_volcan(4) = -35. |
---|
118 | lat_volcan(5) = -70. |
---|
119 | lon_volcan(1) = -125. |
---|
120 | lon_volcan(2) = -35. |
---|
121 | lon_volcan(3) = 55. |
---|
122 | lon_volcan(4) = 145. |
---|
123 | |
---|
124 | ig_volcan(ilat,ilon)= 0 |
---|
125 | if ((nbp_lon*nbp_lat)==1) then ! running a 1D simulation |
---|
126 | deltalat=180. |
---|
127 | deltalon=360. |
---|
128 | else |
---|
129 | deltalat = 180./(nbp_lat-1) |
---|
130 | deltalon = 360./nbp_lon |
---|
131 | endif |
---|
132 | |
---|
133 | do i=1,nlon |
---|
134 | do ilat=1,nblat |
---|
135 | do ilon=1,nblon |
---|
136 | if ((xlat(i).ge.lat_volcan(ilat)) |
---|
137 | & .and.((xlat(i)-deltalat).lt.lat_volcan(ilat)) |
---|
138 | & .and.(xlon(i).le.lon_volcan(ilon)) |
---|
139 | & .and.((xlon(i)+deltalon).gt.lon_volcan(ilon)) ) then |
---|
140 | ig_volcan(ilat,ilon)= i |
---|
141 | area_emiss(ilat,ilon) = cell_area(i) |
---|
142 | print*,"Lat,lon=",ilat,ilon," OK" |
---|
143 | end if |
---|
144 | end do |
---|
145 | end do |
---|
146 | end do |
---|
147 | |
---|
148 | c Reinit des traceurs si necessaire |
---|
149 | if (reinit_trac) then |
---|
150 | tr_seri(:,:,:)=0. |
---|
151 | c CAS N2 TRACEUR PASSIF POUR EVALUER PROFIL SOUS 7 KM |
---|
152 | c J'ai mis Nemiss=0 ! |
---|
153 | do i=1,klon |
---|
154 | do k=1,klev |
---|
155 | tr_seri(i,k,:)=max(min(0.035, |
---|
156 | & 0.035*(1.-log(paprs(i,k)/6.e6)/log(9.e6/6.e6))),0.) |
---|
157 | enddo |
---|
158 | enddo |
---|
159 | c FIN CAS N2 PASSIF |
---|
160 | endif |
---|
161 | |
---|
162 | C========================================================================= |
---|
163 | C========================================================================= |
---|
164 | ENDIF ! fin debutphy |
---|
165 | c------------- |
---|
166 | c fin debutphy |
---|
167 | c------------- |
---|
168 | |
---|
169 | c====================================================================== |
---|
170 | c Emission d'un traceur pendant un certain temps |
---|
171 | c necessite raz_date=1 dans run.def |
---|
172 | c et reinit_trac=y |
---|
173 | c====================================================================== |
---|
174 | deltatr(:,:,:) = 0. |
---|
175 | |
---|
176 | c source appliquee pendant Nemiss Ed |
---|
177 | if (timesimu .lt. 86400*Nemiss) then |
---|
178 | |
---|
179 | c emet les traceurs qui sont presents sur la grille |
---|
180 | do ilat = 1,nblat |
---|
181 | do ilon = 1,nblon |
---|
182 | if (ig_volcan(ilat,ilon).ne.0) then |
---|
183 | |
---|
184 | do iz = 1,nbz |
---|
185 | it=min( (iz-1)*nblat*nblon+(ilat-1)*nblon+ilon , nqtot ) |
---|
186 | i=ig_volcan(ilat,ilon) |
---|
187 | |
---|
188 | c injection dans une seule cellule: |
---|
189 | c source en kg/kg/s |
---|
190 | c deltatr(i,Nheight(iz),it) = so2_quantity/(86400.*Nemiss) ! kg/s |
---|
191 | c $ *RG/( area_emiss(ilat,ilon) |
---|
192 | c $ *(paprs(i,Nheight(iz))-paprs(i,Nheight(iz)+1)) ) ! /kg (masse cellule) |
---|
193 | |
---|
194 | c tr_seri(i,Nheight(iz),it) = tr_seri(i,Nheight(iz),it) |
---|
195 | c $ + deltatr(i,Nheight(iz),it)*pdtphys |
---|
196 | |
---|
197 | c injection dans toute la colonne (a faire): |
---|
198 | do k=1,Nheight(iz) |
---|
199 | deltatr(i,k,it) = so2_quantity/(86400.*Nemiss) ! kg/s |
---|
200 | $ *RG/( area_emiss(ilat,ilon) |
---|
201 | $ *(paprs(i,1)-paprs(i,Nheight(iz)+1)) ) ! /kg (masse colonne) |
---|
202 | |
---|
203 | tr_seri(i,k,it) = tr_seri(i,k,it)+deltatr(i,k,it)*pdtphys |
---|
204 | end do |
---|
205 | |
---|
206 | end do |
---|
207 | |
---|
208 | endif ! ig_volcan!=0 |
---|
209 | end do |
---|
210 | end do |
---|
211 | |
---|
212 | end if ! duree emission |
---|
213 | |
---|
214 | c====================================================================== |
---|
215 | c====================================================================== |
---|
216 | |
---|
217 | RETURN |
---|
218 | END |
---|