@@ -159,6 +159,7 @@ SUBROUTINE mynnedmf_wrapper_run( &
159
159
& icloud_bl , do_mynnsfclay , &
160
160
& imp_physics , imp_physics_gfdl , &
161
161
& imp_physics_thompson , imp_physics_wsm6 , &
162
+ & chem3d , frp , mix_chem , fire_turb , nchem , ndvel , &
162
163
& ltaerosol , spp_wts_pbl , spp_pbl , lprnt , huge , errmsg , errflg )
163
164
164
165
! should be moved to inside the mynn:
@@ -179,11 +180,8 @@ SUBROUTINE mynnedmf_wrapper_run( &
179
180
logical , intent (in ) :: cplflx
180
181
181
182
! smoke/chem
182
- ! logical, intent(in) :: mix_chem, fire_turb
183
- ! integer, intent(in) :: nchem, ndvel, kdvel
184
- ! for testing only:
185
- logical , parameter :: mix_chem= .false. , fire_turb= .false.
186
- integer , parameter :: nchem= 2 , ndvel= 2 , kdvel= 1
183
+ integer , intent (in ) :: nchem, ndvel
184
+ integer , parameter :: kdvel= 1
187
185
188
186
! NAMELIST OPTIONS (INPUT):
189
187
logical , intent (in ) :: &
@@ -285,17 +283,11 @@ SUBROUTINE mynnedmf_wrapper_run( &
285
283
real (kind= kind_phys), allocatable :: old_ozone(:,:)
286
284
287
285
! smoke/chem arrays
288
- ! real(kind=kind_phys), dimension(:,:), intent(inout), optional :: &
289
- ! & qgrs_smoke_conc, qgrs_dust_conc
290
- ! real(kind=kind_phys), allocatable, dimension(:,:,:) :: chem3d
291
- ! real(kind=kind_phys), dimension(:,:), intent(in), optional :: vdep
292
- ! real(kind=kind_phys), dimension(:), intent(in), optional :: frp, emis_ant_no
293
- ! for testing only
294
- real (kind= kind_phys), dimension (im,levs) :: &
295
- & qgrs_smoke_conc, qgrs_dust_conc
296
- real (kind= kind_phys), allocatable , dimension (:,:,:) :: chem3d
297
- real (kind= kind_phys), dimension (im,ndvel) :: vdep ! not passed in yet???
298
- real (kind= kind_phys), dimension (im) :: frp, emis_ant_no
286
+ real (kind_phys), dimension (:), intent (inout ) :: frp
287
+ logical , intent (in ) :: mix_chem, fire_turb
288
+ real (kind= kind_phys), dimension (:,:,:), intent (inout ) :: chem3d
289
+ real (kind= kind_phys), dimension (im) :: emis_ant_no
290
+ real (kind= kind_phys), dimension (im,ndvel) :: vdep
299
291
300
292
! MYNN-2D
301
293
real (kind= kind_phys), dimension (:), intent (in ) :: &
@@ -361,20 +353,8 @@ SUBROUTINE mynnedmf_wrapper_run( &
361
353
endif
362
354
363
355
! initialize arrays for test
364
- qgrs_smoke_conc = 1.0
365
- qgrs_dust_conc = 1.0
366
- FRP = 0 .
367
356
EMIS_ANT_NO = 0 .
368
357
vdep = 0 . ! hli for chem dry deposition, 0 temporarily
369
- if (mix_chem) then
370
- allocate ( chem3d(im,levs,nchem) )
371
- do k= 1 ,levs
372
- do i= 1 ,im
373
- chem3d(i,k,1 )= qgrs_smoke_conc(i,k)
374
- chem3d(i,k,2 )= qgrs_dust_conc (i,k)
375
- enddo
376
- enddo
377
- endif
378
358
379
359
! Check incoming moist species to ensure non-negative values
380
360
! First, create height (dz) and pressure differences (delp)
@@ -966,10 +946,6 @@ SUBROUTINE mynnedmf_wrapper_run( &
966
946
deallocate (save_qke_adv)
967
947
endif
968
948
969
- if (allocated (chem3d))then
970
- deallocate (chem3d)
971
- endif
972
-
973
949
CONTAINS
974
950
975
951
SUBROUTINE dtend_helper (itracer ,field ,mult )
0 commit comments