SCALE-RM
Functions/Subroutines
mod_atmos_phy_sf_driver Module Reference

module ATMOSPHERE / Physics Surface fluxes More...

Functions/Subroutines

subroutine, public atmos_phy_sf_driver_setup
 Setup. More...
 
subroutine, public atmos_phy_sf_driver_calc_tendency (update_flag)
 calculation tendency More...
 
subroutine history_output
 

Detailed Description

module ATMOSPHERE / Physics Surface fluxes

Description
Flux from/to bottom boundary of atmosphere (surface)
Author
Team SCALE
NAMELIST
  • No namelist group
History Output
namedescriptionunitvariable
SFLX_{TRACER_NAME} surface {TRACER_NAME} flux;
{TRACER_NAME} depends on the physics schemes, e.g., QV, QC, QR.
kg/m2/s SFLX_QTRC
GHFLX ground heat flux (downward) W/m2 SFLX_GH
LHFLX latent heat flux W/m2 SFLX_LH
MSLP mean sea-level pressure Pa MSLP
MUFLX u-momentum flux kg/m/s2 SFLX_MU
MVFLX v-momentum flux kg/m/s2 SFLX_MV
MWFLX w-momentum flux kg/m/s2 SFLX_MW
Q2 2m specific humidity kg/kg Q2
Qstar moisuter scale kg/kg Qstar
RLmo inverse of Obukhov length 1/m RLmo
SFC_ALB_IR_dif surface albedo (IR; diffuse) 1 SFC_albedo
SFC_ALB_IR_dir surface albedo (IR; direct 1 SFC_albedo
SFC_ALB_NIR_dif surface albedo (NIR; diffuse 1 SFC_albedo
SFC_ALB_NIR_dir surface albedo (NIR; direct 1 SFC_albedo
SFC_ALB_VIS_dif surface albedo (VIS; diffuse 1 SFC_albedo
SFC_ALB_VIS_dir surface albedo (VIS; direct 1 SFC_albedo
SFC_DENS surface atmospheric density kg/m3 SFC_DENS
SFC_PRES surface atmospheric pressure Pa SFC_PRES
SFC_TEMP surface skin temperature K SFC_TEMP
SFC_Z0E roughness length (vapor) m SFC_Z0E
SFC_Z0H roughness length (heat) m SFC_Z0H
SFC_Z0M roughness length (momentum) m SFC_Z0M
SFLX_ENGI ground internal energy flux (merged) W/m2 SFLX_ENGI
SHFLX sensible heat flux W/m2 SFLX_SH
T2 2m air temperature K T2
Tstar temperature scale K Tstar
U10 10m x-wind m/s U10
U10m 10m eastward wind m/s U10m
Uabs10 10m absolute wind m/s Uabs10
Ustar friction velocity m/s Ustar
V10 10m y-wind m/s V10
V10m 10m northward wind m/s V10m
Wstar convective velocity scale m/s Wstar

Function/Subroutine Documentation

◆ atmos_phy_sf_driver_setup()

subroutine, public mod_atmos_phy_sf_driver::atmos_phy_sf_driver_setup

Setup.

Definition at line 50 of file mod_atmos_phy_sf_driver.F90.

50  use scale_prc, only: &
51  prc_abort
52  use scale_atmos_phy_sf_bulk, only: &
54  use scale_atmos_phy_sf_const, only: &
56  use mod_atmos_admin, only: &
59  use mod_atmos_phy_sf_vars, only: &
60  sfc_z0m => atmos_phy_sf_sfc_z0m, &
61  sfc_z0h => atmos_phy_sf_sfc_z0h, &
62  sfc_z0e => atmos_phy_sf_sfc_z0e, &
63  sflx_mw => atmos_phy_sf_sflx_mw, &
64  sflx_mu => atmos_phy_sf_sflx_mu, &
65  sflx_mv => atmos_phy_sf_sflx_mv, &
66  sflx_sh => atmos_phy_sf_sflx_sh, &
67  sflx_lh => atmos_phy_sf_sflx_lh, &
68  sflx_shex => atmos_phy_sf_sflx_shex, &
69  sflx_qvex => atmos_phy_sf_sflx_qvex, &
70  sflx_qtrc => atmos_phy_sf_sflx_qtrc, &
71  sflx_engi => atmos_phy_sf_sflx_engi, &
72  ustar => atmos_phy_sf_ustar, &
73  tstar => atmos_phy_sf_tstar, &
74  qstar => atmos_phy_sf_qstar, &
75  wstar => atmos_phy_sf_wstar, &
76  rlmo => atmos_phy_sf_rlmo
77  use mod_cpl_admin, only: &
78  cpl_sw
79  implicit none
80  !---------------------------------------------------------------------------
81 
82  log_newline
83  log_info("ATMOS_PHY_SF_driver_setup",*) 'Setup'
84 
85  if ( atmos_sw_phy_sf ) then
86 
87  if ( cpl_sw ) then
88  log_info("ATMOS_PHY_SF_driver_setup",*) 'Coupler is enabled.'
89  else
90  ! setup library component
91  select case( atmos_phy_sf_type )
92  case ( 'BULK' )
94  case ( 'CONST' )
96  case default
97  log_error("ATMOS_PHY_SF_driver_setup",*) 'invalid Surface flux type(', trim(atmos_phy_sf_type), '). CHECK!'
98  call prc_abort
99  end select
100  endif
101 
102  else
103 
104  log_info("ATMOS_PHY_SF_driver_setup",*) 'this component is never called.'
105  log_info("ATMOS_PHY_SF_driver_setup",*) 'surface fluxes are set to zero.'
106  sflx_mw(:,:) = 0.0_rp
107  sflx_mu(:,:) = 0.0_rp
108  sflx_mv(:,:) = 0.0_rp
109  sflx_sh(:,:) = 0.0_rp
110  sflx_lh(:,:) = 0.0_rp
111  sflx_shex(:,:) = 0.0_rp
112  sflx_qvex(:,:) = 0.0_rp
113  ustar(:,:) = 0.0_rp
114  tstar(:,:) = 0.0_rp
115  qstar(:,:) = 0.0_rp
116  wstar(:,:) = 0.0_rp
117  rlmo(:,:) = 0.0_rp
118  log_info("ATMOS_PHY_SF_driver_setup",*) 'SFC_TEMP, SFC_albedo is set in ATMOS_PHY_SF_vars.'
119 
120  endif
121 
122  sflx_qtrc(:,:,:) = 0.0_rp
123  sflx_engi(:,:) = 0.0_rp
124 
125  return

References scale_atmos_phy_sf_bulk::atmos_phy_sf_bulk_setup(), scale_atmos_phy_sf_const::atmos_phy_sf_const_setup(), mod_atmos_phy_sf_vars::atmos_phy_sf_qstar, mod_atmos_phy_sf_vars::atmos_phy_sf_rlmo, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0e, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0h, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0m, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_engi, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_lh, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mu, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mv, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mw, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qtrc, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qvex, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_sh, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_shex, mod_atmos_phy_sf_vars::atmos_phy_sf_tstar, mod_atmos_admin::atmos_phy_sf_type, mod_atmos_phy_sf_vars::atmos_phy_sf_ustar, mod_atmos_phy_sf_vars::atmos_phy_sf_wstar, mod_atmos_admin::atmos_sw_phy_sf, mod_cpl_admin::cpl_sw, and scale_prc::prc_abort().

Referenced by mod_atmos_driver::atmos_driver_setup().

Here is the call graph for this function:
Here is the caller graph for this function:

◆ atmos_phy_sf_driver_calc_tendency()

subroutine, public mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency ( logical, intent(in)  update_flag)

calculation tendency

Definition at line 131 of file mod_atmos_phy_sf_driver.F90.

131  use scale_const, only: &
132  undef => const_undef, &
133  pre00 => const_pre00
134  use scale_atmos_grid_cartesc_real, only: &
140  use scale_topography, only: &
141  tansl_x => topography_tansl_x, &
142  tansl_y => topography_tansl_y
143  use scale_time, only: &
144  dt_sf => time_dtsec_atmos_phy_sf
145  use scale_statistics, only: &
147  statistics_total
148  use scale_atmos_bottom, only: &
149  bottom_estimate => atmos_bottom_estimate
150  use scale_atmos_hydrometeor, only: &
152  lhv, &
153  i_qv
154  use scale_atmos_phy_sf_bulk, only: &
156  use scale_atmos_phy_sf_const, only: &
158  use scale_bulkflux, only: &
159  bulkflux_diagnose_scales
160  use mod_atmos_admin, only: &
162  use mod_atmos_vars, only: &
163  dens => dens_av, &
164  rhot => rhot_av, &
165  pott, &
166  temp, &
167  pres, &
168  w, &
169  u, &
170  v, &
171  qv, &
172  cptot, &
173  cvtot, &
174  dens_t => dens_tp, &
175  momz_t => momz_tp, &
176  rhou_t => rhou_tp, &
177  rhov_t => rhov_tp, &
178  rhoh => rhoh_p, &
179  rhoq_t => rhoq_tp
180  use mod_atmos_phy_rd_vars, only: &
181  sflx_lw_dn => atmos_phy_rd_sflx_lw_dn, &
182  sflx_sw_dn => atmos_phy_rd_sflx_sw_dn
183  use mod_atmos_phy_bl_vars, only: &
184  pbl_zi => atmos_phy_bl_zi
185  use mod_atmos_phy_sf_vars, only: &
186  dens_t_sf => atmos_phy_sf_dens_t, &
187  momz_t_sf => atmos_phy_sf_momz_t, &
188  rhou_t_sf => atmos_phy_sf_rhou_t, &
189  rhov_t_sf => atmos_phy_sf_rhov_t, &
190  rhoh_sf => atmos_phy_sf_rhoh, &
191  rhoq_t_sf => atmos_phy_sf_rhoq_t, &
192  sfc_dens => atmos_phy_sf_sfc_dens, &
193  sfc_pres => atmos_phy_sf_sfc_pres, &
194  sfc_temp => atmos_phy_sf_sfc_temp, &
195  sfc_z0m => atmos_phy_sf_sfc_z0m, &
196  sfc_z0h => atmos_phy_sf_sfc_z0h, &
197  sfc_z0e => atmos_phy_sf_sfc_z0e, &
198  sflx_mw => atmos_phy_sf_sflx_mw, &
199  sflx_mu => atmos_phy_sf_sflx_mu, &
200  sflx_mv => atmos_phy_sf_sflx_mv, &
201  sflx_sh => atmos_phy_sf_sflx_sh, &
202  sflx_lh => atmos_phy_sf_sflx_lh, &
203  sflx_shex => atmos_phy_sf_sflx_shex, &
204  sflx_qvex => atmos_phy_sf_sflx_qvex, &
205  sflx_qtrc => atmos_phy_sf_sflx_qtrc, &
206  sflx_engi => atmos_phy_sf_sflx_engi, &
207  ustar => atmos_phy_sf_ustar, &
208  tstar => atmos_phy_sf_tstar, &
209  qstar => atmos_phy_sf_qstar, &
210  wstar => atmos_phy_sf_wstar, &
211  rlmo => atmos_phy_sf_rlmo, &
212  u10 => atmos_phy_sf_u10, &
213  v10 => atmos_phy_sf_v10, &
214  t2 => atmos_phy_sf_t2, &
215  q2 => atmos_phy_sf_q2
216  use mod_cpl_admin, only: &
217  cpl_sw
218  implicit none
219 
220  logical, intent(in) :: update_flag
221 
222  real(RP) :: ATM_W (IA,JA)
223  real(RP) :: ATM_U (IA,JA)
224  real(RP) :: ATM_V (IA,JA)
225  real(RP) :: ATM_DENS(IA,JA)
226  real(RP) :: ATM_TEMP(IA,JA)
227  real(RP) :: ATM_PRES(IA,JA)
228  real(RP) :: ATM_QV (IA,JA)
229  real(RP) :: SFLX_SH2(IA,JA)
230  real(RP) :: SFLX_QV (IA,JA)
231  real(RP) :: CP_t, CV_t
232  real(RP) :: ENGI_t
233  real(RP) :: rdz
234  real(RP) :: work
235 
236  integer :: i, j, iq
237  !---------------------------------------------------------------------------
238 
239  if ( update_flag ) then
240 
241  ! update surface density, surface pressure
242  call bottom_estimate( ka, ks, ke, ia, is, ie, ja, js, je, &
243  dens(:,:,:), pres(:,:,:), qv(:,:,:), & ! [IN]
244  sfc_temp(:,:), & ! [IN]
245  fz(:,:,:), & ! [IN]
246  sfc_dens(:,:), sfc_pres(:,:) ) ! [OUT]
247 
248  !$omp parallel do
249  do j = js, je
250  do i = is, ie
251  atm_dens(i,j) = dens(ks,i,j)
252  atm_temp(i,j) = temp(ks,i,j)
253  atm_pres(i,j) = pres(ks,i,j)
254  end do
255  end do
256 
257  if ( cpl_sw ) then
258 
259  !$omp parallel do
260  do j = js, je
261  do i = is, ie
262  sflx_sh2(i,j) = sflx_sh(i,j) - sflx_shex(i,j)
263  end do
264  end do
265 
266  if ( atmos_hydrometeor_dry ) then
267  !$omp parallel do
268  do j = js, je
269  do i = is, ie
270  sflx_qv(i,j) = 0.0_rp
271  end do
272  end do
273  else
274  !$omp parallel do
275  do j = js, je
276  do i = is, ie
277  sflx_qv(i,j) = sflx_qtrc(i,j,i_qv) - sflx_qvex(i,j)
278  end do
279  end do
280  end if
281 
282  call bulkflux_diagnose_scales( ia, is, ie, ja, js, je, &
283  sflx_mw(:,:), sflx_mu(:,:), sflx_mv(:,:), & ! [IN]
284  sflx_sh2(:,:), sflx_qv(:,:), & ! [IN]
285  sfc_dens(:,:), sfc_temp(:,:), pbl_zi(:,:), & ! [IN]
286  ustar(:,:), tstar(:,:), qstar(:,:), & ! [OUT]
287  wstar(:,:), rlmo(:,:) ) ! [OUT]
288  else
289 
290  !$omp parallel do
291  do j = js, je
292  do i = is, ie
293  atm_u(i,j) = u(ks,i,j)
294  atm_v(i,j) = v(ks,i,j)
295  atm_w(i,j) = atm_u(i,j) * tansl_x(i,j) + atm_v(i,j) * tansl_y(i,j)
296  atm_qv(i,j) = qv(ks,i,j)
297  enddo
298  enddo
299 
300  select case ( atmos_phy_sf_type )
301  case ( 'BULK' )
302 
303  call atmos_phy_sf_bulk_flux( ia, is, ie, ja, js, je, & ! [IN]
304  atm_w(:,:), atm_u(:,:), atm_v(:,:), & ! [IN]
305  atm_temp(:,:), atm_pres(:,:), atm_qv(:,:), & ! [IN]
306  sfc_dens(:,:), sfc_temp(:,:), sfc_pres(:,:), & ! [IN]
307  sfc_z0m(:,:), sfc_z0h(:,:), sfc_z0e(:,:), & ! [IN]
308  pbl_zi(:,:), z1(:,:), & ! [IN]
309  sflx_mw(:,:), sflx_mu(:,:), sflx_mv(:,:), & ! [OUT]
310  sflx_sh(:,:), sflx_lh(:,:), sflx_qv(:,:), & ! [OUT]
311  ustar(:,:), tstar(:,:), qstar(:,:), & ! [OUT]
312  wstar(:,:), & ! [OUT]
313  rlmo(:,:), & ! [OUT]
314  u10(:,:), v10(:,:), t2(:,:), q2(:,:) ) ! [OUT]
315 
316  case ( 'CONST' )
317 
318  call atmos_phy_sf_const_flux( ia, is, ie, ja, js, je, & ! [IN]
319  atm_w(:,:), atm_u(:,:), atm_v(:,:), sfc_temp(:,:), & ! [IN]
320  z1(:,:), sfc_dens(:,:), & ! [IN]
321  sflx_mw(:,:), sflx_mu(:,:), sflx_mv(:,:), & ! [OUT]
322  sflx_sh(:,:), sflx_lh(:,:), sflx_qv(:,:), & ! [OUT]
323  u10(:,:), v10(:,:) ) ! [OUT]
324  ustar(:,:) = undef
325  tstar(:,:) = undef
326  qstar(:,:) = undef
327  rlmo(:,:) = undef
328  t2(:,:) = atm_temp(:,:)
329  q2(:,:) = atm_qv(:,:)
330 
331  end select
332 
333  if ( .NOT. atmos_hydrometeor_dry ) then
334  sflx_qtrc(:,:,i_qv) = sflx_qv(:,:)
335  sflx_engi(:,:) = sflx_qv(:,:) * ( tracer_cv(i_qv) * sfc_temp(:,:) + lhv )
336  endif
337 
338  endif
339 
340  call history_output
341 
342 !OCL XFILL
343  !$omp parallel do &
344  !$omp private(rdz)
345  do j = js, je
346  do i = is, ie
347  rdz = 1.0_rp / ( fz(ks,i,j) - fz(ks-1,i,j) )
348  momz_t_sf(i,j) = sflx_mw(i,j) / ( cz(ks+1,i,j) - cz(ks,i,j) )
349  rhou_t_sf(i,j) = sflx_mu(i,j) * rdz
350  rhov_t_sf(i,j) = sflx_mv(i,j) * rdz
351  enddo
352  enddo
353 
354  !$omp parallel do &
355  !$omp private(work,rdz,CP_t,CV_t,ENGI_t)
356  do j = js, je
357  do i = is, ie
358  rdz = 1.0_rp / ( fz(ks,i,j) - fz(ks-1,i,j) )
359  dens_t_sf(i,j) = 0.0_rp
360  cp_t = 0.0_rp
361  cv_t = 0.0_rp
362  engi_t = sflx_engi(i,j) * rdz
363  do iq = 1, qa
364  work = sflx_qtrc(i,j,iq) * rdz
365 
366  rhoq_t_sf(i,j,iq) = work
367  dens_t_sf(i,j) = dens_t_sf(i,j) + work * tracer_mass(iq)
368  cp_t = cp_t + work * tracer_cp(iq)
369  cv_t = cv_t + work * tracer_cv(iq)
370  engi_t = engi_t - tracer_engi0(iq) * work
371  end do
372  cp_t = ( cp_t - cptot(ks,i,j) * dens_t_sf(i,j) ) / atm_dens(i,j)
373  cv_t = ( cv_t - cvtot(ks,i,j) * dens_t_sf(i,j) ) / atm_dens(i,j)
374 
375  rhoh_sf(i,j) = sflx_sh(i,j) * rdz + engi_t &
376  - ( cp_t + log( atm_pres(i,j) / pre00 ) * ( cvtot(ks,i,j) / cptot(ks,i,j) * cp_t - cv_t ) ) * atm_dens(i,j) * atm_temp(i,j)
377  enddo
378  enddo
379 
380  endif
381 
382  !$omp parallel do
383  do j = js, je
384  do i = is, ie
385  momz_t(ks,i,j) = momz_t(ks,i,j) + momz_t_sf(i,j)
386  rhou_t(ks,i,j) = rhou_t(ks,i,j) + rhou_t_sf(i,j)
387  rhov_t(ks,i,j) = rhov_t(ks,i,j) + rhov_t_sf(i,j)
388  rhoh(ks,i,j) = rhoh(ks,i,j) + rhoh_sf(i,j)
389  dens_t(ks,i,j) = dens_t(ks,i,j) + dens_t_sf(i,j)
390  enddo
391  enddo
392 
393  !$omp parallel
394  do iq = 1, qa
395  !$omp do
396  do j = js, je
397  do i = is, ie
398  rhoq_t(ks,i,j,iq) = rhoq_t(ks,i,j,iq) + rhoq_t_sf(i,j,iq)
399  enddo
400  enddo
401  !$omp end do nowait
402  enddo
403  !$omp end parallel
404 
405  if ( statistics_checktotal ) then
406 
407  if ( .NOT. atmos_hydrometeor_dry ) then
408  do iq = 1, qa
409  call statistics_total( ia, is, ie, ja, js, je, &
410  sflx_qtrc(:,:,iq), 'SFLX_'//trim(tracer_name(iq)), &
413  enddo
414  endif
415 
416  call statistics_total( ia, is, ie, ja, js, je, &
417  dens_t_sf(:,:), 'DENS_t_SF', &
420  call statistics_total( ia, is, ie, ja, js, je, &
421  momz_t_sf(:,:), 'MOMZ_t_SF', &
424  call statistics_total( ia, is, ie, ja, js, je, &
425  rhou_t_sf(:,:), 'RHOU_t_SF', &
428  call statistics_total( ia, is, ie, ja, js, je, &
429  rhov_t_sf(:,:), 'RHOV_t_SF', &
432  call statistics_total( ia, is, ie, ja, js, je, &
433  rhoh_sf(:,:), 'RHOH_SF', &
436 
437  do iq = 1, qa
438  call statistics_total( ia, is, ie, ja, js, je, &
439  rhoq_t_sf(:,:,iq), trim(tracer_name(iq))//'_t_SF', &
442  enddo
443 
444  endif
445 
446  return

References scale_atmos_bottom::atmos_bottom_estimate(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_area, scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_cz, scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_fz, scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_totarea, scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_z1, scale_atmos_hydrometeor::atmos_hydrometeor_dry, mod_atmos_phy_bl_vars::atmos_phy_bl_zi, mod_atmos_phy_rd_vars::atmos_phy_rd_sflx_lw_dn, mod_atmos_phy_rd_vars::atmos_phy_rd_sflx_sw_dn, scale_atmos_phy_sf_bulk::atmos_phy_sf_bulk_flux(), scale_atmos_phy_sf_const::atmos_phy_sf_const_flux(), mod_atmos_phy_sf_vars::atmos_phy_sf_dens_t, mod_atmos_phy_sf_vars::atmos_phy_sf_momz_t, mod_atmos_phy_sf_vars::atmos_phy_sf_q2, mod_atmos_phy_sf_vars::atmos_phy_sf_qstar, mod_atmos_phy_sf_vars::atmos_phy_sf_rhoh, mod_atmos_phy_sf_vars::atmos_phy_sf_rhoq_t, mod_atmos_phy_sf_vars::atmos_phy_sf_rhou_t, mod_atmos_phy_sf_vars::atmos_phy_sf_rhov_t, mod_atmos_phy_sf_vars::atmos_phy_sf_rlmo, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_dens, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_pres, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_temp, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0e, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0h, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0m, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_engi, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_lh, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mu, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mv, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mw, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qtrc, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qvex, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_sh, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_shex, mod_atmos_phy_sf_vars::atmos_phy_sf_t2, mod_atmos_phy_sf_vars::atmos_phy_sf_tstar, mod_atmos_admin::atmos_phy_sf_type, mod_atmos_phy_sf_vars::atmos_phy_sf_u10, mod_atmos_phy_sf_vars::atmos_phy_sf_ustar, mod_atmos_phy_sf_vars::atmos_phy_sf_v10, mod_atmos_phy_sf_vars::atmos_phy_sf_wstar, scale_const::const_pre00, scale_const::const_undef, mod_cpl_admin::cpl_sw, mod_atmos_vars::cptot, mod_atmos_vars::cvtot, mod_atmos_vars::dens, mod_atmos_vars::dens_av, mod_atmos_vars::dens_tp, history_output(), scale_atmos_hydrometeor::i_qv, scale_atmos_grid_cartesc_index::ia, scale_atmos_grid_cartesc_index::ie, scale_atmos_grid_cartesc_index::is, scale_atmos_grid_cartesc_index::ja, scale_atmos_grid_cartesc_index::je, scale_atmos_grid_cartesc_index::js, scale_atmos_grid_cartesc_index::ka, scale_atmos_grid_cartesc_index::ke, scale_atmos_grid_cartesc_index::ks, scale_atmos_hydrometeor::lhv, mod_atmos_vars::momz_tp, mod_atmos_vars::pott, mod_atmos_vars::pres, scale_tracer::qa, mod_atmos_vars::qv, mod_atmos_vars::rhoh_p, mod_atmos_vars::rhoq_tp, mod_atmos_vars::rhot, mod_atmos_vars::rhot_av, mod_atmos_vars::rhou_tp, mod_atmos_vars::rhov_tp, scale_statistics::statistics_checktotal, mod_atmos_vars::temp, scale_time::time_dtsec_atmos_phy_sf, scale_topography::topography_tansl_x, scale_topography::topography_tansl_y, scale_tracer::tracer_cp, scale_tracer::tracer_cv, scale_tracer::tracer_engi0, scale_tracer::tracer_mass, scale_tracer::tracer_name, mod_atmos_vars::u, mod_atmos_vars::v, and mod_atmos_vars::w.

Referenced by mod_atmos_driver::atmos_driver_calc_tendency(), and mod_atmos_driver::atmos_driver_calc_tendency_from_sflux().

Here is the call graph for this function:
Here is the caller graph for this function:

◆ history_output()

subroutine mod_atmos_phy_sf_driver::history_output

Definition at line 451 of file mod_atmos_phy_sf_driver.F90.

451  use scale_const, only: &
452  undef => const_undef
453  use scale_file_history, only: &
454  file_history_in
455  use scale_atmos_hydrostatic, only: &
456  barometric_law_mslp => atmos_hydrostatic_barometric_law_mslp
457  use scale_atmos_grid_cartesc_real, only: &
458  real_cz => atmos_grid_cartesc_real_cz
461  use scale_atmos_hydrometeor, only: &
463  i_qv
464  use mod_atmos_vars, only: &
465  temp, &
466  pres, &
467  qv
468  use mod_atmos_phy_sf_vars, only: &
469  sfc_dens => atmos_phy_sf_sfc_dens, &
470  sfc_pres => atmos_phy_sf_sfc_pres, &
471  sfc_temp => atmos_phy_sf_sfc_temp, &
472  sfc_albedo => atmos_phy_sf_sfc_albedo, &
473  sfc_z0m => atmos_phy_sf_sfc_z0m, &
474  sfc_z0h => atmos_phy_sf_sfc_z0h, &
475  sfc_z0e => atmos_phy_sf_sfc_z0e, &
476  sflx_mw => atmos_phy_sf_sflx_mw, &
477  sflx_mu => atmos_phy_sf_sflx_mu, &
478  sflx_mv => atmos_phy_sf_sflx_mv, &
479  sflx_sh => atmos_phy_sf_sflx_sh, &
480  sflx_lh => atmos_phy_sf_sflx_lh, &
481  sflx_gh => atmos_phy_sf_sflx_gh, &
482  sflx_qtrc => atmos_phy_sf_sflx_qtrc, &
483  sflx_engi => atmos_phy_sf_sflx_engi, &
484  ustar => atmos_phy_sf_ustar, &
485  tstar => atmos_phy_sf_tstar, &
486  qstar => atmos_phy_sf_qstar, &
487  wstar => atmos_phy_sf_wstar, &
488  rlmo => atmos_phy_sf_rlmo, &
489  u10 => atmos_phy_sf_u10, &
490  v10 => atmos_phy_sf_v10, &
491  t2 => atmos_phy_sf_t2, &
492  q2 => atmos_phy_sf_q2
493  implicit none
494 
495  real(RP) :: MSLP (IA,JA) ! mean sea-level pressure [Pa]
496  real(RP) :: Uabs10(IA,JA) ! 10m absolute wind [m/s]
497  real(RP) :: U10m (IA,JA) ! eastward 10m wind
498  real(RP) :: V10m (IA,JA) ! northward 10m wind
499 
500  integer :: i, j, iq
501  !---------------------------------------------------------------------------
502 
503 !OCL XFILL
504  !$omp parallel do
505  do j = js, je
506  do i = is, ie
507  uabs10(i,j) = sqrt( u10(i,j)**2 + v10(i,j)**2 )
508  u10m(i,j) = u10(i,j) * rotc(i,j,1) - v10(i,j) * rotc(i,j,2)
509  v10m(i,j) = u10(i,j) * rotc(i,j,2) + v10(i,j) * rotc(i,j,1)
510  enddo
511  enddo
512 
513 
514  call barometric_law_mslp( ka, ks, ke, ia, is, ie, ja, js, je, & ! [IN]
515  pres(:,:,:), temp(:,:,:), qv(:,:,:), & ! [IN]
516  real_cz(:,:,:), & ! [IN]
517  mslp(:,:) ) ! [OUT]
518 
519  call file_history_in( sfc_dens(:,:), 'SFC_DENS', 'surface atmospheric density', 'kg/m3' )
520  call file_history_in( sfc_pres(:,:), 'SFC_PRES', 'surface atmospheric pressure', 'Pa' )
521  call file_history_in( sfc_temp(:,:), 'SFC_TEMP', 'surface skin temperature', 'K' )
522  call file_history_in( sfc_albedo(:,:,i_r_direct ,i_r_ir ), 'SFC_ALB_IR_dir' , 'surface albedo (IR; direct', '1' , fill_halo=.true. )
523  call file_history_in( sfc_albedo(:,:,i_r_diffuse,i_r_ir ), 'SFC_ALB_IR_dif' , 'surface albedo (IR; diffuse)', '1' , fill_halo=.true. )
524  call file_history_in( sfc_albedo(:,:,i_r_direct ,i_r_nir), 'SFC_ALB_NIR_dir', 'surface albedo (NIR; direct', '1' , fill_halo=.true. )
525  call file_history_in( sfc_albedo(:,:,i_r_diffuse,i_r_nir), 'SFC_ALB_NIR_dif', 'surface albedo (NIR; diffuse', '1' , fill_halo=.true. )
526  call file_history_in( sfc_albedo(:,:,i_r_direct ,i_r_vis), 'SFC_ALB_VIS_dir', 'surface albedo (VIS; direct', '1' , fill_halo=.true. )
527  call file_history_in( sfc_albedo(:,:,i_r_diffuse,i_r_vis), 'SFC_ALB_VIS_dif', 'surface albedo (VIS; diffuse', '1' , fill_halo=.true. )
528  call file_history_in( sfc_z0m(:,:), 'SFC_Z0M', 'roughness length (momentum)', 'm' , fill_halo=.true. )
529  call file_history_in( sfc_z0h(:,:), 'SFC_Z0H', 'roughness length (heat)', 'm' , fill_halo=.true. )
530  call file_history_in( sfc_z0e(:,:), 'SFC_Z0E', 'roughness length (vapor)', 'm' , fill_halo=.true. )
531  call file_history_in( sflx_mw(:,:), 'MWFLX', 'w-momentum flux', 'kg/m/s2' )
532  call file_history_in( sflx_mu(:,:), 'MUFLX', 'u-momentum flux', 'kg/m/s2' )
533  call file_history_in( sflx_mv(:,:), 'MVFLX', 'v-momentum flux', 'kg/m/s2' )
534  call file_history_in( sflx_sh(:,:), 'SHFLX', 'sensible heat flux', 'W/m2' , fill_halo=.true. )
535  call file_history_in( sflx_lh(:,:), 'LHFLX', 'latent heat flux', 'W/m2' , fill_halo=.true. )
536  call file_history_in( sflx_gh(:,:), 'GHFLX', 'ground heat flux (downward)', 'W/m2' , fill_halo=.true. )
537  do iq = 1, qa
538  call file_history_in( sflx_qtrc(:,:,iq), 'SFLX_'//trim(tracer_name(iq)), &
539  'surface '//trim(tracer_name(iq))//' flux', &
540  'kg/m2/s' , fill_halo=.true. )
541  enddo
542  call file_history_in( sflx_engi(:,:), 'SFLX_ENGI', 'ground internal energy flux (merged)', 'W/m2' , fill_halo=.true. )
543 
544  call file_history_in( ustar(:,:), 'Ustar', 'friction velocity', 'm/s' , fill_halo=.true. )
545  call file_history_in( tstar(:,:), 'Tstar', 'temperature scale', 'K' , fill_halo=.true. )
546  call file_history_in( qstar(:,:), 'Qstar', 'moisuter scale', 'kg/kg', fill_halo=.true. )
547  call file_history_in( wstar(:,:), 'Wstar', 'convective velocity scale', 'm/s', fill_halo=.true. )
548  call file_history_in( rlmo(:,:), 'RLmo', 'inverse of Obukhov length', '1/m' , fill_halo=.true. )
549  call file_history_in( uabs10(:,:), 'Uabs10', '10m absolute wind', 'm/s' , fill_halo=.true. )
550  call file_history_in( u10(:,:), 'U10', '10m x-wind', 'm/s' , fill_halo=.true. )
551  call file_history_in( v10(:,:), 'V10', '10m y-wind', 'm/s' , fill_halo=.true. )
552  call file_history_in( u10m(:,:), 'U10m', '10m eastward wind', 'm/s' , fill_halo=.true. )
553  call file_history_in( v10m(:,:), 'V10m', '10m northward wind', 'm/s' , fill_halo=.true. )
554  call file_history_in( t2(:,:), 'T2 ', '2m air temperature', 'K' , fill_halo=.true. )
555  call file_history_in( q2(:,:), 'Q2 ', '2m specific humidity', 'kg/kg', fill_halo=.true. )
556  call file_history_in( mslp(:,:), 'MSLP', 'mean sea-level pressure', 'Pa' , fill_halo=.true., standard_name='air_pressure_at_mean_sea_level' )
557 
558  return

References scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotc, scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_cz, scale_atmos_hydrometeor::atmos_hydrometeor_dry, mod_atmos_phy_sf_vars::atmos_phy_sf_q2, mod_atmos_phy_sf_vars::atmos_phy_sf_qstar, mod_atmos_phy_sf_vars::atmos_phy_sf_rlmo, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_albedo, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_dens, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_pres, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_temp, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0e, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0h, mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0m, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_engi, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_gh, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_lh, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mu, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mv, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mw, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qtrc, mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_sh, mod_atmos_phy_sf_vars::atmos_phy_sf_t2, mod_atmos_phy_sf_vars::atmos_phy_sf_tstar, mod_atmos_phy_sf_vars::atmos_phy_sf_u10, mod_atmos_phy_sf_vars::atmos_phy_sf_ustar, mod_atmos_phy_sf_vars::atmos_phy_sf_v10, mod_atmos_phy_sf_vars::atmos_phy_sf_wstar, scale_const::const_undef, scale_atmos_hydrometeor::i_qv, scale_cpl_sfc_index::i_r_diffuse, scale_cpl_sfc_index::i_r_direct, scale_cpl_sfc_index::i_r_ir, scale_cpl_sfc_index::i_r_nir, scale_cpl_sfc_index::i_r_vis, scale_atmos_grid_cartesc_index::ie, scale_atmos_grid_cartesc_index::is, scale_atmos_grid_cartesc_index::je, scale_atmos_grid_cartesc_index::js, scale_atmos_grid_cartesc_index::ka, scale_atmos_grid_cartesc_index::ke, scale_atmos_grid_cartesc_index::ks, mod_atmos_vars::pres, scale_tracer::qa, mod_atmos_vars::qv, mod_atmos_vars::temp, and scale_tracer::tracer_name.

Referenced by atmos_phy_sf_driver_calc_tendency().

Here is the caller graph for this function:
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0m
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sfc_z0m
Definition: mod_atmos_phy_sf_vars.F90:66
scale_statistics
module Statistics
Definition: scale_statistics.F90:11
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_dens
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sfc_dens
Definition: mod_atmos_phy_sf_vars.F90:71
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mu
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_mu
Definition: mod_atmos_phy_sf_vars.F90:77
scale_prc::prc_abort
subroutine, public prc_abort
Abort Process.
Definition: scale_prc.F90:342
scale_atmos_phy_sf_bulk::atmos_phy_sf_bulk_flux
subroutine, public atmos_phy_sf_bulk_flux(IA, IS, IE, JA, JS, JE, ATM_W, ATM_U, ATM_V, ATM_TEMP, ATM_PRES, ATM_QV, SFC_DENS, SFC_TEMP, SFC_PRES, SFC_Z0M, SFC_Z0H, SFC_Z0E, PBL, ATM_Z1, SFLX_MW, SFLX_MU, SFLX_MV, SFLX_SH, SFLX_LH, SFLX_QV, Ustar, Tstar, Qstar, Wstar, RLmo, U10, V10, T2, Q2)
Calculate surface flux.
Definition: scale_atmos_phy_sf_bulk.F90:92
mod_atmos_vars::rhoq_tp
real(rp), dimension(:,:,:,:), allocatable, public rhoq_tp
Definition: mod_atmos_vars.F90:120
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_cz
real(rp), dimension(:,:,:), allocatable, public atmos_grid_cartesc_real_cz
geopotential height [m] (zxy)
Definition: scale_atmos_grid_cartesC_real.F90:38
mod_atmos_phy_sf_vars::atmos_phy_sf_v10
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_v10
Definition: mod_atmos_phy_sf_vars.F90:94
mod_atmos_vars::pott
real(rp), dimension(:,:,:), allocatable, target, public pott
Definition: mod_atmos_vars.F90:132
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0e
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sfc_z0e
Definition: mod_atmos_phy_sf_vars.F90:68
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_z1
real(rp), dimension(:,:), allocatable, public atmos_grid_cartesc_real_z1
Height of the lowermost grid from surface (cell center) [m].
Definition: scale_atmos_grid_cartesC_real.F90:59
scale_topography::topography_tansl_y
real(rp), dimension(:,:), allocatable, public topography_tansl_y
tan(slope_y)
Definition: scale_topography.F90:40
mod_atmos_vars::rhov_tp
real(rp), dimension(:,:,:), allocatable, public rhov_tp
Definition: mod_atmos_vars.F90:117
mod_atmos_admin
module ATMOS admin
Definition: mod_atmos_admin.F90:11
mod_atmos_phy_sf_vars::atmos_phy_sf_qstar
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_qstar
Definition: mod_atmos_phy_sf_vars.F90:90
mod_atmos_phy_sf_vars::atmos_phy_sf_rhoh
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_rhoh
Definition: mod_atmos_phy_sf_vars.F90:61
mod_atmos_phy_sf_vars::atmos_phy_sf_ustar
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_ustar
Definition: mod_atmos_phy_sf_vars.F90:88
mod_atmos_phy_sf_vars::atmos_phy_sf_wstar
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_wstar
Definition: mod_atmos_phy_sf_vars.F90:91
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_totarea
real(rp), public atmos_grid_cartesc_real_totarea
total area (xy, local) [m2]
Definition: scale_atmos_grid_cartesC_real.F90:77
mod_atmos_vars::cptot
real(rp), dimension(:,:,:), allocatable, target, public cptot
Definition: mod_atmos_vars.F90:142
scale_atmos_grid_cartesc_metric
module Atmosphere Grid CartesianC metirc
Definition: scale_atmos_grid_cartesC_metric.F90:12
scale_bulkflux
module Surface bulk flux
Definition: scale_bulkflux.F90:12
mod_atmos_vars::rhot_av
real(rp), dimension(:,:,:), pointer, public rhot_av
Definition: mod_atmos_vars.F90:93
scale_atmos_hydrometeor
module atmosphere / hydrometeor
Definition: scale_atmos_hydrometeor.F90:12
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mv
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_mv
Definition: mod_atmos_phy_sf_vars.F90:78
mod_atmos_phy_rd_vars
module Atmosphere / Physics Radiation
Definition: mod_atmos_phy_rd_vars.F90:12
mod_atmos_phy_sf_vars
module ATMOSPHERIC Surface Variables
Definition: mod_atmos_phy_sf_vars.F90:12
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_mw
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_mw
Definition: mod_atmos_phy_sf_vars.F90:76
scale_topography
module TOPOGRAPHY
Definition: scale_topography.F90:11
scale_atmos_hydrometeor::atmos_hydrometeor_dry
logical, public atmos_hydrometeor_dry
Definition: scale_atmos_hydrometeor.F90:97
mod_atmos_vars::rhot
real(rp), dimension(:,:,:), allocatable, target, public rhot
Definition: mod_atmos_vars.F90:79
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_z0h
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sfc_z0h
Definition: mod_atmos_phy_sf_vars.F90:67
scale_atmos_grid_cartesc_real
module Atmosphere GRID CartesC Real(real space)
Definition: scale_atmos_grid_cartesC_real.F90:11
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_temp
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sfc_temp
Definition: mod_atmos_phy_sf_vars.F90:64
scale_file_history
module file_history
Definition: scale_file_history.F90:15
scale_atmos_phy_sf_bulk
module atmosphere / physics / surface / bulk
Definition: scale_atmos_phy_sf_bulk.F90:13
scale_atmos_phy_sf_bulk::atmos_phy_sf_bulk_setup
subroutine, public atmos_phy_sf_bulk_setup
Setup.
Definition: scale_atmos_phy_sf_bulk.F90:50
scale_prc
module PROCESS
Definition: scale_prc.F90:11
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qvex
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_qvex
Definition: mod_atmos_phy_sf_vars.F90:82
mod_atmos_phy_sf_vars::atmos_phy_sf_u10
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_u10
Definition: mod_atmos_phy_sf_vars.F90:93
mod_atmos_vars::rhou_tp
real(rp), dimension(:,:,:), allocatable, public rhou_tp
Definition: mod_atmos_vars.F90:116
mod_atmos_admin::atmos_phy_sf_type
character(len=h_short), public atmos_phy_sf_type
Definition: mod_atmos_admin.F90:40
mod_atmos_phy_rd_vars::atmos_phy_rd_sflx_lw_dn
real(rp), dimension(:,:), allocatable, public atmos_phy_rd_sflx_lw_dn
Definition: mod_atmos_phy_rd_vars.F90:61
mod_atmos_phy_bl_vars
module atmosphere / physics / PBL
Definition: mod_atmos_phy_bl_vars.F90:12
mod_atmos_phy_rd_vars::atmos_phy_rd_sflx_sw_dn
real(rp), dimension(:,:), allocatable, public atmos_phy_rd_sflx_sw_dn
Definition: mod_atmos_phy_rd_vars.F90:63
mod_atmos_vars::dens
real(rp), dimension(:,:,:), allocatable, target, public dens
Definition: mod_atmos_vars.F90:75
mod_atmos_phy_sf_vars::atmos_phy_sf_rhoq_t
real(rp), dimension(:,:,:), allocatable, public atmos_phy_sf_rhoq_t
Definition: mod_atmos_phy_sf_vars.F90:62
scale_const
module CONSTANT
Definition: scale_const.F90:11
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_shex
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_shex
Definition: mod_atmos_phy_sf_vars.F90:81
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_albedo
real(rp), dimension(:,:,:,:), allocatable, public atmos_phy_sf_sfc_albedo
Definition: mod_atmos_phy_sf_vars.F90:65
scale_atmos_hydrometeor::lhv
real(rp), public lhv
latent heat of vaporization for use [J/kg]
Definition: scale_atmos_hydrometeor.F90:126
scale_time::time_dtsec_atmos_phy_sf
real(dp), public time_dtsec_atmos_phy_sf
time interval of physics(surface flux) [sec]
Definition: scale_time.F90:40
scale_topography::topography_tansl_x
real(rp), dimension(:,:), allocatable, public topography_tansl_x
tan(slope_x)
Definition: scale_topography.F90:39
mod_atmos_phy_sf_vars::atmos_phy_sf_rlmo
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_rlmo
Definition: mod_atmos_phy_sf_vars.F90:98
mod_atmos_vars::v
real(rp), dimension(:,:,:), allocatable, target, public v
Definition: mod_atmos_vars.F90:130
mod_atmos_phy_bl_vars::atmos_phy_bl_zi
real(rp), dimension(:,:), allocatable, public atmos_phy_bl_zi
Definition: mod_atmos_phy_bl_vars.F90:64
mod_atmos_vars::w
real(rp), dimension(:,:,:), allocatable, target, public w
Definition: mod_atmos_vars.F90:128
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_area
real(rp), dimension(:,:), allocatable, public atmos_grid_cartesc_real_area
horizontal area ( xy, normal z) [m2]
Definition: scale_atmos_grid_cartesC_real.F90:65
mod_atmos_vars::momz_tp
real(rp), dimension(:,:,:), allocatable, public momz_tp
Definition: mod_atmos_vars.F90:115
scale_atmos_phy_sf_const::atmos_phy_sf_const_setup
subroutine, public atmos_phy_sf_const_setup
Setup.
Definition: scale_atmos_phy_sf_const.F90:65
mod_atmos_vars::temp
real(rp), dimension(:,:,:), allocatable, target, public temp
Definition: mod_atmos_vars.F90:133
mod_atmos_vars::dens_tp
real(rp), dimension(:,:,:), allocatable, public dens_tp
Definition: mod_atmos_vars.F90:114
scale_time
module TIME
Definition: scale_time.F90:11
mod_atmos_vars::qv
real(rp), dimension(:,:,:), allocatable, pointer, target, public qv
Definition: mod_atmos_vars.F90:96
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qtrc
real(rp), dimension(:,:,:), allocatable, target, public atmos_phy_sf_sflx_qtrc
Definition: mod_atmos_phy_sf_vars.F90:84
scale_atmos_hydrometeor::i_qv
integer, public i_qv
Definition: scale_atmos_hydrometeor.F90:77
mod_atmos_vars::pres
real(rp), dimension(:,:,:), allocatable, target, public pres
Definition: mod_atmos_vars.F90:134
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_engi
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_engi
Definition: mod_atmos_phy_sf_vars.F90:85
mod_atmos_vars::dens_av
real(rp), dimension(:,:,:), pointer, public dens_av
Definition: mod_atmos_vars.F90:89
mod_atmos_vars::u
real(rp), dimension(:,:,:), allocatable, target, public u
Definition: mod_atmos_vars.F90:129
mod_atmos_phy_sf_vars::atmos_phy_sf_t2
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_t2
Definition: mod_atmos_phy_sf_vars.F90:95
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_lh
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_lh
Definition: mod_atmos_phy_sf_vars.F90:80
mod_atmos_phy_sf_vars::atmos_phy_sf_dens_t
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_dens_t
Definition: mod_atmos_phy_sf_vars.F90:57
scale_atmos_hydrostatic
module atmosphere / hydrostatic barance
Definition: scale_atmos_hydrostatic.F90:12
mod_atmos_phy_sf_vars::atmos_phy_sf_sfc_pres
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sfc_pres
Definition: mod_atmos_phy_sf_vars.F90:72
mod_atmos_vars::rhoh_p
real(rp), dimension(:,:,:), allocatable, public rhoh_p
Definition: mod_atmos_vars.F90:119
scale_statistics::statistics_checktotal
logical, public statistics_checktotal
calc&report variable totals to logfile?
Definition: scale_statistics.F90:64
mod_atmos_vars
module ATMOSPHERIC Variables
Definition: mod_atmos_vars.F90:12
scale_atmos_bottom
module atmosphere / bottom boundary extrapolation
Definition: scale_atmos_bottom.F90:12
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_sh
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_sh
Definition: mod_atmos_phy_sf_vars.F90:79
mod_atmos_phy_sf_vars::atmos_phy_sf_q2
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_q2
Definition: mod_atmos_phy_sf_vars.F90:96
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_fz
real(rp), dimension(:,:,:), allocatable, public atmos_grid_cartesc_real_fz
geopotential height [m] (wxy)
Definition: scale_atmos_grid_cartesC_real.F90:42
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_gh
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_sflx_gh
Definition: mod_atmos_phy_sf_vars.F90:83
mod_atmos_phy_sf_vars::atmos_phy_sf_rhou_t
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_rhou_t
Definition: mod_atmos_phy_sf_vars.F90:59
scale_const::const_undef
real(rp), public const_undef
Definition: scale_const.F90:41
scale_atmos_phy_sf_const::atmos_phy_sf_const_flux
subroutine, public atmos_phy_sf_const_flux(IA, IS, IE, JA, JS, JE, ATM_W, ATM_U, ATM_V, ATM_TEMP, ATM_Z1, SFC_DENS, SFLX_MW, SFLX_MU, SFLX_MV, SFLX_SH, SFLX_LH, SFLX_QV, U10, V10)
Constant flux.
Definition: scale_atmos_phy_sf_const.F90:110
scale_const::const_pre00
real(rp), public const_pre00
pressure reference [Pa]
Definition: scale_const.F90:88
mod_cpl_admin::cpl_sw
logical, public cpl_sw
Definition: mod_cpl_admin.F90:33
mod_atmos_vars::cvtot
real(rp), dimension(:,:,:), allocatable, target, public cvtot
Definition: mod_atmos_vars.F90:141
scale_atmos_bottom::atmos_bottom_estimate
subroutine, public atmos_bottom_estimate(KA, KS, KE, IA, IS, IE, JA, JS, JE, DENS, PRES, QV, SFC_TEMP, FZ, SFC_DENS, SFC_PRES)
Calc bottom boundary of atmosphere (just above surface)
Definition: scale_atmos_bottom.F90:51
scale_atmos_phy_sf_const
module atmosphere / physics / surface / const
Definition: scale_atmos_phy_sf_const.F90:13
mod_atmos_phy_sf_vars::atmos_phy_sf_tstar
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_tstar
Definition: mod_atmos_phy_sf_vars.F90:89
mod_cpl_admin
module Coupler admin
Definition: mod_cpl_admin.F90:11
mod_atmos_phy_sf_vars::atmos_phy_sf_momz_t
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_momz_t
Definition: mod_atmos_phy_sf_vars.F90:58
mod_atmos_phy_sf_vars::atmos_phy_sf_rhov_t
real(rp), dimension(:,:), allocatable, public atmos_phy_sf_rhov_t
Definition: mod_atmos_phy_sf_vars.F90:60
scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotc
real(rp), dimension(:,:,:), allocatable, public atmos_grid_cartesc_metric_rotc
rotation coefficient
Definition: scale_atmos_grid_cartesC_metric.F90:35
mod_atmos_admin::atmos_sw_phy_sf
logical, public atmos_sw_phy_sf
Definition: mod_atmos_admin.F90:56