/[lmdze]/trunk/phylmd/newmicro.f90
ViewVC logotype

Contents of /trunk/phylmd/newmicro.f90

Parent Directory Parent Directory | Revision Log Revision Log


Revision 341 - (show annotations)
Mon Oct 21 06:11:44 2019 UTC (4 years, 7 months ago) by guez
File size: 6178 byte(s)
Remove intermediate variables in `pbl_surface`

Remove file `diagcld2.f90`, no longer used since revision 340.

In procedure cdrag, rename zcdn to cdn. In procedure `interfsurf_hq`,
rename `temp_air` to t1lay: this is the corresponding name in
`calcul_fluxs`, is consistent with the other names `[uvq]1lay` and is
more precise.

In procedure `pbl_surface`, rename t and q to `t_seri` and `q_seri`,
which are the names in procedure physiq. Remove needless intermediate
variables qair1, tairsol, psfce, patm and zgeo1. Remove useless
initialization of yrugos. Remove a useless assignment `i = ni(j)`.

1 module newmicro_m
2
3 IMPLICIT none
4
5 contains
6
7 SUBROUTINE newmicro (paprs, play, t, cldliq, clc, cldtau, clemi, cldh, cldl, &
8 cldm, cldt, ctlwp, flwp, fiwp, flwc, fiwc)
9
10 ! From LMDZ4/libf/phylmd/newmicro.F, version 1.2 2004/06/03 09:22:43
11
12 ! Authors: Z. X. Li (LMD/CNRS), Johannes Quaas
13 ! Date: 1993/09/10
14 ! Objet: calcul de l'\'epaisseur optique et de l'\'emissivit\'e des nuages.
15
16 USE conf_phys_m, ONLY: rad_chau1, rad_chau2
17 USE dimphy, ONLY: klev, klon
18 USE histwrite_phy_m, ONLY: histwrite_phy
19 USE suphec_m, ONLY: rg
20
21 REAL, intent(in):: paprs(:, :) ! (klon, klev+1)
22 ! pression pour chaque inter-couche, en Pa
23
24 real, intent(in):: play(:, :) ! (klon, klev)
25 REAL, intent(in):: t(:, :) ! (klon, klev) temperature
26
27 REAL, intent(in):: cldliq(:, :) ! (klon, klev)
28 ! mass fraction of liquid water in atmosphere
29
30 REAL, intent(inout):: clc(:, :) ! (klon, klev)
31 ! couverture nuageuse pour le rayonnement (0 à 1)
32
33 REAL, intent(out):: cldtau(:, :) ! (klon, klev)
34 ! \'epaisseur optique des nuages
35
36 REAL, intent(out):: clemi(:, :) ! (klon, klev)
37 ! \'emissivit\'e des nuages (0 à 1)
38
39 REAL, intent(out):: cldh(:), cldl(:), cldm(:), cldt(:) ! (klon)
40 REAL, intent(out):: ctlwp(:) ! (klon)
41 REAL, intent(out):: flwp(:), fiwp(:) ! (klon)
42 REAL, intent(out):: flwc(:, :), fiwc(:, :) ! (klon, klev)
43
44 ! Local:
45
46 REAL re(klon, klev)
47 ! cloud droplet effective radius multiplied by fl (micro m)
48
49 REAL fl(klon, klev)
50 ! Denominator to re, introduced to avoid problems in the averaging
51 ! of the output. fl is the fraction of liquid water clouds within
52 ! a grid cell.
53
54 REAL, PARAMETER:: cetahb = 0.45, cetamb = 0.8
55 INTEGER i, k
56 REAL zflwp ! liquid water path, in micrometers
57 real fice ! fraction of ice in cloud
58 REAL rad_chaud ! effective radius of liquid cloud droplets, in micrometers
59 REAL, PARAMETER:: coef_chau = 0.13
60 REAL, PARAMETER:: seuil_neb = 0.001, t_glace = 258.
61 real tc, rei, zfiwp
62 real k_ice
63 real, parameter:: k_ice0 = 0.005 ! units=m2 / g
64 real, parameter:: DF = 1.66 ! diffusivity factor
65
66 !-----------------------------------------------------------------
67
68 ! Calculer l'\'epaisseur optique et l'\'emissivit\'e des nuages
69
70 loop_horizontal: DO i = 1, klon
71 flwp(i) = 0.
72 fiwp(i) = 0.
73
74 loop_vertical: DO k = 1, klev
75 clc(i, k) = MAX(clc(i, k), seuil_neb)
76
77 ! liquid/ice cloud water paths:
78
79 ! Linear transition:
80 fice = 1. - (t(i, k) - t_glace) / (273.13 - t_glace)
81 fice = MIN(MAX(fice, 0.), 1.)
82
83 zflwp = 1000. * (1. - fice) * cldliq(i, k) / clc(i, k) &
84 * (paprs(i, k) - paprs(i, k + 1)) / RG
85 zfiwp = 1000. * fice * cldliq(i, k) / clc(i, k) &
86 * (paprs(i, k) - paprs(i, k + 1)) / RG
87
88 flwp(i) = flwp(i) + (1. - fice) * cldliq(i, k) &
89 * (paprs(i, k) - paprs(i, k + 1)) / RG
90 fiwp(i) = fiwp(i) &
91 + fice * cldliq(i, k) * (paprs(i, k) - paprs(i, k + 1)) / RG
92
93 ! Total Liquid/Ice water content
94 flwc(i, k) = (1.-fice) * cldliq(i, k)
95 fiwc(i, k) = fice * cldliq(i, k)
96 ! In-Cloud Liquid/Ice water content
97
98 ! effective cloud droplet radius (microns):
99
100 ! for liquid water clouds:
101 rad_chaud = merge(rad_chau2, rad_chau1, k <= 3)
102
103 ! For output diagnostics
104
105 ! Cloud droplet effective radius (micro m)
106
107 ! we multiply here with f * xl (fraction of liquid water
108 ! clouds in the grid cell) to avoid problems in the
109 ! averaging of the output.
110 ! In the output of IOIPSL, derive the real cloud droplet
111 ! effective radius as re/fl
112
113 fl(i, k) = clc(i, k) * (1.-fice)
114 re(i, k) = rad_chaud * fl(i, k)
115
116 ! for ice clouds: as a function of the ambiant temperature
117 ! (formula used by Iacobellis and Somerville (2000), with an
118 ! asymptotical value of 3.5 microns at T<-81.4 C added to be
119 ! consistent with observations of Heymsfield et al. 1986):
120 tc = t(i, k)-273.15
121 rei = merge(3.5, 0.71 * tc + 61.29, tc <= -81.4)
122
123 ! Cloud optical thickness. For liquid clouds, traditional
124 ! formula (e. g. Liou 2002 k0795 § 8.4.5.2). For ice clouds,
125 ! Ebert and Curry (1992).
126 if (zfiwp == 0. .or. rei <= 0.) rei = 1.
127 cldtau(i, k) = 3. / 2. * zflwp / rad_chaud &
128 + zfiwp * (3.448e-03 + 2.431 / rei)
129
130 ! cloud infrared emissivity:
131
132 ! (the broadband infrared absorption coefficient is parameterized
133 ! as a function of the effective cld droplet radius)
134
135 ! Ebert and Curry (1992) formula as used by Kiehl & Zender (1995):
136 k_ice = k_ice0 + 1. / rei
137
138 clemi(i, k) = 1. - EXP(- coef_chau * zflwp - DF * k_ice * zfiwp)
139
140 if (clc(i, k) <= seuil_neb) then
141 clc(i, k) = 0.
142 cldtau(i, k) = 0.
143 clemi(i, k) = 0.
144 end if
145 ENDDO loop_vertical
146 ENDDO loop_horizontal
147
148 ! COMPUTE CLOUD LIQUID PATH AND TOTAL CLOUDINESS
149
150 DO i = 1, klon
151 cldt(i)=1.
152 cldh(i)=1.
153 cldm(i) = 1.
154 cldl(i) = 1.
155 ctlwp(i) = 0.
156 ENDDO
157
158 DO k = klev, 1, -1
159 DO i = 1, klon
160 ctlwp(i) = ctlwp(i) &
161 + cldliq(i, k) * (paprs(i, k) - paprs(i, k + 1)) / RG
162 cldt(i) = cldt(i) * (1.-clc(i, k))
163 if (play(i, k) <= cetahb * paprs(i, 1)) &
164 cldh(i) = cldh(i) * (1. - clc(i, k))
165 if (play(i, k) > cetahb * paprs(i, 1) .AND. &
166 play(i, k) <= cetamb * paprs(i, 1)) &
167 cldm(i) = cldm(i) * (1.-clc(i, k))
168 if (play(i, k) > cetamb * paprs(i, 1)) &
169 cldl(i) = cldl(i) * (1. - clc(i, k))
170 ENDDO
171 ENDDO
172
173 DO i = 1, klon
174 cldt(i)=1.-cldt(i)
175 cldh(i)=1.-cldh(i)
176 cldm(i)=1.-cldm(i)
177 cldl(i)=1.-cldl(i)
178 ENDDO
179
180 CALL histwrite_phy("re", re)
181 CALL histwrite_phy("fl", fl)
182
183 END SUBROUTINE newmicro
184
185 end module newmicro_m

  ViewVC Help
Powered by ViewVC 1.1.21