SCALE-RM
Functions/Subroutines | Variables
scale_atmos_phy_ae_dummy Module Reference

module ATMOSPHERE / Physics Aerosol Microphysics More...

Functions/Subroutines

subroutine, public atmos_phy_ae_dummy_setup (AE_TYPE)
 Setup. More...
 
subroutine, public atmos_phy_ae_dummy (DENS, MOMZ, MOMX, MOMY, RHOT, EMIT, NREG, QTRC, CN, CCN, RHOQ_t_AE)
 Aerosol Microphysics. More...
 
subroutine, public atmos_phy_ae_dummy_effectiveradius (Re, QTRC, RH)
 Calculate Effective Radius. More...
 

Variables

real(rp), dimension(:), allocatable, public ae_dens
 

Detailed Description

module ATMOSPHERE / Physics Aerosol Microphysics

Description
dummy code
Author
Team SCALE
History
  • 2013-02-06 (H.Yashiro) [new]

Function/Subroutine Documentation

◆ atmos_phy_ae_dummy_setup()

subroutine, public scale_atmos_phy_ae_dummy::atmos_phy_ae_dummy_setup ( character(len=*), intent(in)  AE_TYPE)

Setup.

Definition at line 55 of file scale_atmos_phy_ae_dummy.F90.

References ae_dens, scale_tracer::ae_qa, scale_stdio::io_fid_log, scale_stdio::io_l, and scale_process::prc_mpistop().

Referenced by scale_atmos_phy_ae::atmos_phy_ae_setup().

55  use scale_process, only: &
57  implicit none
58 
59  character(len=*), intent(in) :: ae_type
60  !---------------------------------------------------------------------------
61 
62  if( io_l ) write(io_fid_log,*)
63  if( io_l ) write(io_fid_log,*) '++++++ Module[AEROSOL] / Categ[ATMOS PHYSICS] / Origin[SCALElib]'
64  if( io_l ) write(io_fid_log,*) '+++ dummy aerosol process'
65  if( io_l ) write(io_fid_log,*) '*** No namelists.'
66 
67  if ( ae_type /= 'DUMMY' .AND. ae_type /= 'NONE' ) then
68  write(*,*) 'xxx ATMOS_PHY_AE_TYPE is not DUMMY. Check!'
69  call prc_mpistop
70  endif
71 
72  allocate( ae_dens(ae_qa) )
73  ae_dens(:) = 0.0_rp
74 
75  return
subroutine, public prc_mpistop
Abort MPI.
module PROCESS
Here is the call graph for this function:
Here is the caller graph for this function:

◆ atmos_phy_ae_dummy()

subroutine, public scale_atmos_phy_ae_dummy::atmos_phy_ae_dummy ( real(rp), dimension(ka,ia,ja), intent(inout)  DENS,
real(rp), dimension(ka,ia,ja), intent(inout)  MOMZ,
real(rp), dimension(ka,ia,ja), intent(inout)  MOMX,
real(rp), dimension(ka,ia,ja), intent(inout)  MOMY,
real(rp), dimension(ka,ia,ja), intent(inout)  RHOT,
real(rp), dimension(ka,ia,ja,qa_ae), intent(inout)  EMIT,
real(rp), dimension(ka,ia,ja), intent(in)  NREG,
real(rp), dimension(ka,ia,ja,qa), intent(inout)  QTRC,
real(rp), dimension(ka,ia,ja), intent(out)  CN,
real(rp), dimension(ka,ia,ja), intent(out)  CCN,
real(rp), dimension(ka,ia,ja,qa), intent(inout)  RHOQ_t_AE 
)

Aerosol Microphysics.

Definition at line 92 of file scale_atmos_phy_ae_dummy.F90.

References scale_stdio::io_fid_log, and scale_stdio::io_l.

Referenced by scale_atmos_phy_ae::atmos_phy_ae_setup().

93  use scale_tracer
94  implicit none
95  real(RP), intent(inout) :: dens(ka,ia,ja)
96  real(RP), intent(inout) :: momz(ka,ia,ja)
97  real(RP), intent(inout) :: momx(ka,ia,ja)
98  real(RP), intent(inout) :: momy(ka,ia,ja)
99  real(RP), intent(inout) :: rhot(ka,ia,ja)
100  real(RP), intent(inout) :: emit(ka,ia,ja,qa_ae)
101  real(RP), intent(in) :: nreg(ka,ia,ja)
102  real(RP), intent(inout) :: qtrc(ka,ia,ja,qa)
103  real(RP), intent(out) :: cn(ka,ia,ja)
104  real(RP), intent(out) :: ccn(ka,ia,ja)
105  real(RP), intent(inout) :: rhoq_t_ae(ka,ia,ja,qa)
106 
107  if( io_l ) write(io_fid_log,*) '*** Physics step: Aerosol(dummy)'
108 
109  cn(:,:,:) = 0.0_rp
110  ccn(:,:,:) = 0.0_rp
111 
112  return
integer, public qa_ae
integer, public qa
module grid index
module TRACER
integer, public ia
of x whole cells (local, with HALO)
integer, public ka
of z whole cells (local, with HALO)
integer, public ja
of y whole cells (local, with HALO)
Here is the caller graph for this function:

◆ atmos_phy_ae_dummy_effectiveradius()

subroutine, public scale_atmos_phy_ae_dummy::atmos_phy_ae_dummy_effectiveradius ( real(rp), dimension (ka,ia,ja,ae_qa), intent(out)  Re,
real(rp), dimension(ka,ia,ja,qa), intent(in)  QTRC,
real(rp), dimension (ka,ia,ja), intent(in)  RH 
)

Calculate Effective Radius.

Definition at line 121 of file scale_atmos_phy_ae_dummy.F90.

References scale_const::const_undef.

Referenced by scale_atmos_phy_ae::atmos_phy_ae_setup().

121  use scale_grid_index
122  use scale_tracer
123  use scale_const, only: &
124  undef => const_undef
125  implicit none
126 
127  real(RP), intent(out) :: re (ka,ia,ja,ae_qa) ! effective radius
128  real(RP), intent(in) :: qtrc(ka,ia,ja,qa) ! tracer mass concentration [kg/kg]
129  real(RP), intent(in) :: rh (ka,ia,ja) ! relative humidity [0-1]
130  !---------------------------------------------------------------------------
131 
132  re(:,:,:,:) = undef
133 
134 ! Re(:,:,:,I_ae_seasalt) = 2.E-4_RP
135 ! Re(:,:,:,I_ae_dust ) = 4.E-6_RP
136 ! Re(:,:,:,I_ae_bc ) = 4.E-8_RP
137 ! Re(:,:,:,I_ae_oc ) = RH(:,:,:)
138 ! Re(:,:,:,I_ae_sulfate) = RH(:,:,:)
139 
140  return
integer, public qa
real(rp), public const_undef
Definition: scale_const.F90:43
module grid index
module TRACER
integer, public ia
of x whole cells (local, with HALO)
integer, public ka
of z whole cells (local, with HALO)
integer, public ae_qa
module CONSTANT
Definition: scale_const.F90:14
integer, public ja
of y whole cells (local, with HALO)
Here is the caller graph for this function:

Variable Documentation

◆ ae_dens

real(rp), dimension(:), allocatable, public scale_atmos_phy_ae_dummy::ae_dens

Definition at line 40 of file scale_atmos_phy_ae_dummy.F90.

Referenced by atmos_phy_ae_dummy_setup().

40  real(RP), public, allocatable :: ae_dens(:) ! aerosol density [kg/m3]=[g/L]