SCALE-RM
Functions/Subroutines
mod_atmos_phy_ae_driver Module Reference

module ATMOSPHERE / Physics Aerosol Microphysics More...

Functions/Subroutines

subroutine, public atmos_phy_ae_driver_tracer_setup
 Setup. More...
 
subroutine, public atmos_phy_ae_driver_setup
 Setup. More...
 
subroutine, public atmos_phy_ae_driver_finalize
 finalize More...
 
subroutine, public atmos_phy_ae_driver_adjustment
 adjustment More...
 
subroutine, public atmos_phy_ae_driver_calc_tendency (update_flag)
 Driver. More...
 

Detailed Description

module ATMOSPHERE / Physics Aerosol Microphysics

Description
Aerosol Microphysics driver
Author
Team SCALE
NAMELIST
  • No namelist group
History Output
namedescriptionunitvariable
CCN cloud condensation nucrei num/cc CCN*1.E-6_RP
CN condensation nucrei num/cc CN *1.E-6_RP

Function/Subroutine Documentation

◆ atmos_phy_ae_driver_tracer_setup()

subroutine, public mod_atmos_phy_ae_driver::atmos_phy_ae_driver_tracer_setup

Setup.

Definition at line 50 of file mod_atmos_phy_ae_driver.F90.

51  use mod_atmos_admin, only: &
54  use scale_tracer, only: &
56  use scale_atmos_phy_ae_kajino13, only: &
61  use scale_prc, only: &
62  prc_abort
63  use mod_atmos_phy_ae_vars, only: &
64  qa_ae, &
65  qs_ae, &
66  qe_ae
67  implicit none
68 
69  log_newline
70  log_info("ATMOS_PHY_AE_driver_tracer_setup",*) 'Setup'
71 
72  if ( atmos_sw_phy_ae ) then
73  select case ( atmos_phy_ae_type )
74  case ( 'OFF', 'NONE' )
75  log_info("ATMOS_PHY_AE_driver_tracer_setup",*) 'this component is never called.'
76  case ( 'KAJINO13' )
78 
79  call tracer_regist( qs_ae, & ! [OUT]
80  qa_ae, & ! [IN]
81  atmos_phy_ae_kajino13_name(:), & ! [IN]
82  atmos_phy_ae_kajino13_desc(:), & ! [IN]
83  atmos_phy_ae_kajino13_unit(:) ) ! [IN]
84  case ( 'OFFLINE' )
85  log_info("ATMOS_PHY_AE_driver_tracer_setup",*) 'offline aerosol module has no tracers'
86  case default
87  log_error("ATMOS_PHY_AE_driver_tracer_setup",*) 'invalid aerosol type(', atmos_phy_ae_type, '). CHECK!'
88  call prc_abort
89  end select
90 
91  qe_ae = qs_ae + qa_ae - 1
92 
93  else
94  qa_ae = 0
95  qs_ae = -1
96  qe_ae = -2
97  end if
98 
99  return
module ATMOS admin
logical, public atmos_sw_phy_ae
character(len=h_short), public atmos_phy_ae_type
module ATMOSPHERE / Physics Aerosol Microphysics
module atmosphere / physics / aerosol / Kajino13
subroutine, public atmos_phy_ae_kajino13_tracer_setup(QA_AE)
Tracer setup.
character(len=h_short), dimension(:), allocatable, public atmos_phy_ae_kajino13_name
character(len=h_short), dimension(:), allocatable, public atmos_phy_ae_kajino13_unit
character(len=h_mid), dimension(:), allocatable, public atmos_phy_ae_kajino13_desc
module PROCESS
Definition: scale_prc.F90:11
subroutine, public prc_abort
Abort Process.
Definition: scale_prc.F90:350
module TRACER
subroutine, public tracer_regist(QS, NQ, NAME, DESC, UNIT, CV, CP, R, ENGI0, ADVC, MASS)
Regist tracer.

References scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_desc, scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_name, scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tracer_setup(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_unit, mod_atmos_admin::atmos_phy_ae_type, mod_atmos_admin::atmos_sw_phy_ae, scale_prc::prc_abort(), mod_atmos_phy_ae_vars::qa_ae, mod_atmos_phy_ae_vars::qe_ae, mod_atmos_phy_ae_vars::qs_ae, and scale_tracer::tracer_regist().

Referenced by mod_atmos_driver::atmos_driver_tracer_setup().

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

◆ atmos_phy_ae_driver_setup()

subroutine, public mod_atmos_phy_ae_driver::atmos_phy_ae_driver_setup

Setup.

Definition at line 104 of file mod_atmos_phy_ae_driver.F90.

105  use mod_atmos_admin, only: &
108  use scale_atmos_phy_ae_kajino13, only: &
110  use scale_atmos_phy_ae_offline, only: &
112  use scale_prc, only: &
113  prc_abort
114  implicit none
115  !---------------------------------------------------------------------------
116 
117  log_newline
118  log_info("ATMOS_PHY_AE_driver_setup",*) 'Setup'
119 
120  if ( atmos_sw_phy_ae ) then
121 
122  select case ( atmos_phy_ae_type )
123  case ( 'KAJINO13' )
125  case ( 'OFFLINE' )
127  case default
128  log_error("ATMOS_PHY_AE_driver_setup",*) 'invalid aerosol type(', atmos_phy_ae_type, '). CHECK!'
129  call prc_abort
130  end select
131 
132  endif
133 
134  return
subroutine, public atmos_phy_ae_kajino13_setup
Setup.
module atmosphere / physics / aerosol / offline
subroutine, public atmos_phy_ae_offline_setup
Setup.

References scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_setup(), scale_atmos_phy_ae_offline::atmos_phy_ae_offline_setup(), mod_atmos_admin::atmos_phy_ae_type, mod_atmos_admin::atmos_sw_phy_ae, 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_ae_driver_finalize()

subroutine, public mod_atmos_phy_ae_driver::atmos_phy_ae_driver_finalize

finalize

Definition at line 139 of file mod_atmos_phy_ae_driver.F90.

140  use scale_atmos_phy_ae_kajino13, only: &
142  use mod_atmos_admin, only: &
145  implicit none
146  !---------------------------------------------------------------------------
147 
148  log_newline
149  log_info("ATMOS_PHY_AE_driver_finalize",*) 'Finalize'
150 
151  if ( atmos_sw_phy_ae ) then
152  select case ( atmos_phy_ae_type )
153  case ( 'KAJINO13' )
155  case ( 'OFFLINE' )
156  end select
157  endif
158 
159  return
subroutine, public atmos_phy_ae_kajino13_finalize
finalize

References scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_finalize(), mod_atmos_admin::atmos_phy_ae_type, and mod_atmos_admin::atmos_sw_phy_ae.

Referenced by mod_atmos_driver::atmos_driver_finalize().

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

◆ atmos_phy_ae_driver_adjustment()

subroutine, public mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment

adjustment

Definition at line 164 of file mod_atmos_phy_ae_driver.F90.

165  use mod_atmos_vars, only: &
166  qtrc
167  use mod_atmos_phy_ae_vars, only: &
168  qa_ae, &
169  qs_ae, &
170  qe_ae
171  use mod_atmos_admin, only: &
174  use scale_atmos_phy_ae_kajino13, only: &
176  implicit none
177 
178  if ( atmos_sw_phy_ae ) then
179 
180  select case ( atmos_phy_ae_type )
181  case ( 'KAJINO13' )
182  call atmos_phy_ae_kajino13_negative_fixer( ka, ks, ke, ia, is, ie, ja, js, je, qa_ae, &
183  qtrc(:,:,:,qs_ae:qe_ae) ) ! [INOUT]
184  end select
185 
186  end if
187 
188  return
module ATMOSPHERIC Variables
real(rp), dimension(:,:,:,:), allocatable, target, public qtrc
subroutine, public atmos_phy_ae_kajino13_negative_fixer(KA, KS, KE, IA, IS, IE, JA, JS, JE, QA_AE, QTRC)

References scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), mod_atmos_admin::atmos_phy_ae_type, mod_atmos_admin::atmos_sw_phy_ae, 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, mod_atmos_phy_ae_vars::qa_ae, mod_atmos_phy_ae_vars::qe_ae, mod_atmos_phy_ae_vars::qs_ae, and mod_atmos_vars::qtrc.

Referenced by mod_atmos_driver::atmos_driver_update().

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

◆ atmos_phy_ae_driver_calc_tendency()

subroutine, public mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency ( logical, intent(in)  update_flag)

Driver.

Definition at line 193 of file mod_atmos_phy_ae_driver.F90.

194  use scale_tracer, only: &
196  use scale_prc, only: &
197  prc_abort
198  use scale_time, only: &
199  dt_ae => time_dtsec_atmos_phy_ae, &
201  use scale_statistics, only: &
203  statistics_total
204  use scale_atmos_grid_cartesc_real, only: &
207  use scale_file_history, only: &
208  file_history_in
209  use mod_atmos_vars, only: &
210  dens => dens_av, &
211  qtrc => qtrc_av, &
212  qdry, &
213  pres, &
214  temp, &
215  qv, &
216  rhoq_t => rhoq_tp
217  use mod_atmos_phy_ae_vars, only: &
218  qa_ae, &
219  qs_ae, &
220  qe_ae, &
221  rhoq_t_ae => atmos_phy_ae_rhoq_t, &
222  ccn => atmos_phy_ae_ccn, &
223  ccn_t => atmos_phy_ae_ccn_t, &
224  ae_emit => atmos_phy_ae_emit
225  use mod_atmos_phy_mp_vars, only: &
226  evaporate => atmos_phy_mp_evaporate
227  use mod_atmos_admin, only: &
229  use scale_atmos_phy_ae_kajino13, only: &
231  use scale_atmos_phy_ae_offline, only: &
233  implicit none
234 
235  logical, intent(in) :: update_flag
236 
237  real(RP) :: CN(KA,IA,JA)
238  real(RP) :: NREG(KA,IA,JA)
239 
240  integer :: k, i, j, iq
241  !---------------------------------------------------------------------------
242 
243  if ( update_flag ) then
244 
245 !OCL XFILL
246  ccn(:,:,:) = 0.0_rp ! reset
247 !OCL XFILL
248  rhoq_t_ae(:,:,:,:) = 0.0_rp ! reset
249 
250  do j = js, je
251  do i = is, ie
252  do k = ks, ke
253  nreg(k,i,j) = evaporate(k,i,j) * dt_ae
254  enddo
255  enddo
256  enddo
257 
258  select case ( atmos_phy_ae_type )
259  case ( 'KAJINO13' )
260  call atmos_phy_ae_kajino13_tendency( ka, ks, ke, ia, is, ie, ja, js, je, qa_ae, &
261  temp(:,:,:), & ! [IN]
262  pres(:,:,:), & ! [IN]
263  qdry(:,:,:), & ! [IN]
264  nreg(:,:,:), & ! [IN]
265  dens(:,:,:), & ! [IN]
266  qv(:,:,:), & ! [IN]
267  qtrc(:,:,:,qs_ae:qe_ae), & ! [IN]
268  ae_emit(:,:,:,qs_ae:qe_ae), & ! [IN]
269  dt_ae, & ! [IN]
270  rhoq_t_ae(:,:,:,qs_ae:qe_ae), & ! [OUT]
271  cn(:,:,:), & ! [OUT]
272  ccn(:,:,:) ) ! [OUT]
273  case ( 'OFFLINE' )
274  call atmos_phy_ae_offline_tendency ( ka, ks, ke, ia, is, ie, ja, js, je, &
275  time_nowdaysec, & ! [IN]
276  ccn(:,:,:) ) ! [OUT]
277  cn(:,:,:) = 0.0_rp ! not supported
278  end select
279 
280  ccn_t(:,:,:) = ccn(:,:,:) / dt_ae
281 
282  call file_history_in( cn(:,:,:)*1.e-6_rp, 'CN', 'condensation nucrei', 'num/cc' )
283  call file_history_in( ccn(:,:,:)*1.e-6_rp, 'CCN', 'cloud condensation nucrei', 'num/cc' )
284 
285  endif
286 
287  do iq = qs_ae, qe_ae
288  !$omp parallel do private(i,j,k) OMP_SCHEDULE_
289  do j = js, je
290  do i = is, ie
291  do k = ks, ke
292  rhoq_t(k,i,j,iq) = rhoq_t(k,i,j,iq) + rhoq_t_ae(k,i,j,iq)
293  enddo
294  enddo
295  enddo
296  enddo
297 
298  if ( statistics_checktotal ) then
299  do iq = qs_ae, qe_ae
300  call statistics_total( ka, ks, ke, ia, is, ie, ja, js, je, &
301  rhoq_t_ae(:,:,:,iq), trim(tracer_name(iq))//'_t_AE', &
304  enddo
305  endif
306 
307  return
real(rp), dimension(:,:,:), allocatable, public atmos_phy_ae_ccn_t
real(rp), dimension(:,:,:,:), allocatable, public atmos_phy_ae_emit
real(rp), dimension(:,:,:), allocatable, public atmos_phy_ae_ccn
real(rp), dimension(:,:,:,:), allocatable, public atmos_phy_ae_rhoq_t
module Atmosphere / Physics Cloud Microphysics
real(rp), dimension(:,:,:), allocatable, public atmos_phy_mp_evaporate
real(rp), dimension(:,:,:,:), pointer, public qtrc_av
real(rp), dimension(:,:,:), pointer, public dens_av
real(rp), dimension(:,:,:), allocatable, target, public qdry
real(rp), dimension(:,:,:), allocatable, target, public temp
real(rp), dimension(:,:,:,:), allocatable, public rhoq_tp
real(rp), dimension(:,:,:), allocatable, target, public dens
real(rp), dimension(:,:,:), allocatable, pointer, target, public qv
real(rp), dimension(:,:,:), allocatable, target, public pres
module Atmosphere GRID CartesC Real(real space)
real(rp), dimension(:,:,:), allocatable, public atmos_grid_cartesc_real_vol
control volume (zxy) [m3]
real(rp), public atmos_grid_cartesc_real_totvol
total volume (zxy, local) [m3]
subroutine, public atmos_phy_ae_kajino13_tendency(KA, KS, KE, IA, IS, IE, JA, JS, JE, QA_AE, TEMP, PRES, QDRY, NREG, DENS, QV, QTRC, EMIT, dt, RHOQ_t_AE, CN, CCN)
Aerosol Microphysics.
subroutine, public atmos_phy_ae_offline_tendency(KA, KS, KE, IA, IS, IE, JA, JS, JE, time_now, CCN)
Aerosol Microphysics.
module file_history
module Statistics
logical, public statistics_checktotal
calc&report variable totals to logfile?
module TIME
Definition: scale_time.F90:11
real(dp), public time_dtsec_atmos_phy_ae
time interval of physics(aerosol ) [sec]
Definition: scale_time.F90:44
real(dp), public time_nowdaysec
second of current time [sec]
Definition: scale_time.F90:72
character(len=h_short), dimension(qa_max), public tracer_name

References scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_totvol, scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_vol, mod_atmos_phy_ae_vars::atmos_phy_ae_ccn, mod_atmos_phy_ae_vars::atmos_phy_ae_ccn_t, mod_atmos_phy_ae_vars::atmos_phy_ae_emit, scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), scale_atmos_phy_ae_offline::atmos_phy_ae_offline_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_rhoq_t, mod_atmos_admin::atmos_phy_ae_type, mod_atmos_phy_mp_vars::atmos_phy_mp_evaporate, mod_atmos_vars::dens, mod_atmos_vars::dens_av, 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_prc::prc_abort(), mod_atmos_vars::pres, mod_atmos_phy_ae_vars::qa_ae, mod_atmos_vars::qdry, mod_atmos_phy_ae_vars::qe_ae, mod_atmos_phy_ae_vars::qs_ae, mod_atmos_vars::qtrc, mod_atmos_vars::qtrc_av, mod_atmos_vars::qv, mod_atmos_vars::rhoq_tp, scale_statistics::statistics_checktotal, mod_atmos_vars::temp, scale_time::time_dtsec_atmos_phy_ae, scale_time::time_nowdaysec, and scale_tracer::tracer_name.

Referenced by mod_atmos_driver::atmos_driver_calc_tendency().

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