Skip to content

Commit

Permalink
Merge branch 'main' of https://github.com/NCAR/ccpp-physics into remo…
Browse files Browse the repository at this point in the history
…ve_optional_arguments_from_ccpp
  • Loading branch information
climbfuji committed Oct 29, 2021
2 parents 9bffa41 + 6912955 commit 1c0776a
Show file tree
Hide file tree
Showing 11 changed files with 9 additions and 8,790 deletions.
8 changes: 4 additions & 4 deletions physics/aerclm_def.F
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
module aerclm_def
use machine , only : kind_phys
use machine , only : kind_phys, kind_io4
implicit none

integer, parameter :: levsaer=72, ntrcaerm=15, timeaer=12
Expand All @@ -10,13 +10,13 @@ module aerclm_def

real (kind=kind_phys), allocatable, dimension(:) :: aer_lat
real (kind=kind_phys), allocatable, dimension(:) :: aer_lon
real (kind=kind_phys), allocatable, dimension(:,:,:,:) :: aer_pres
real (kind=kind_phys), allocatable, dimension(:,:,:,:,:) :: aerin
real (kind=kind_io4), allocatable, dimension(:,:,:,:) :: aer_pres
real (kind=kind_io4), allocatable, dimension(:,:,:,:,:) :: aerin

data aer_time/15.5, 45., 74.5, 105., 135.5, 166., 196.5,
& 227.5, 258., 288.5, 319., 349.5, 380.5/

data specname /'DU001','DU002','DU003','DU004','DU005',
data specname /'DU001','DU002','DU003','DU004','DU005',
& 'SS001','SS002','SS003','SS004','SS005','SO4',
& 'BCPHOBIC','BCPHILIC','OCPHOBIC','OCPHILIC'/

Expand Down
2 changes: 1 addition & 1 deletion physics/aerinterp.F90
Original file line number Diff line number Diff line change
Expand Up @@ -181,7 +181,7 @@ SUBROUTINE read_aerdataf (iamin, iamax, jamin, jamax, &
endif
do i = iamin, iamax
aerin(i,j,k,ii,imon) = 1.d0*buffx(i,j,klev,1)
if(aerin(i,j,k,ii,imon) < 0 .or. aerin(i,j,k,ii,imon) > 1.) then
if(aerin(i,j,k,ii,imon) < 0. .or. aerin(i,j,k,ii,imon) > 1.) then
aerin(i,j,k,ii,imon) = 1.e-15
endif
enddo !i-loop (lon)
Expand Down
9 changes: 2 additions & 7 deletions physics/gfdl_sfc_layer.F90
Original file line number Diff line number Diff line change
Expand Up @@ -100,7 +100,7 @@ end subroutine gfdl_sfc_layer_finalize
!! \htmlinclude gfdl_sfc_layer_run.html
!!
subroutine gfdl_sfc_layer_run (im, nsoil, km, xlat, xlon, flag_iter, lsm, &
lsm_noah, lsm_noahmp, lsm_ruc, lsm_noah_wrfv4, icoef_sf, cplwav, karman,&
lsm_noah, lsm_noahmp, lsm_ruc, icoef_sf, cplwav, karman, &
cplwav2atm, lcurr_sf, pert_Cd, ntsflg, sfenth, z1, shdmax, ivegsrc, &
vegtype, sigmaf, dt, wet, dry, icy, isltyp, rd, grav, ep1, ep2, smois, &
psfc, prsl1, q1, t1, u1, v1, wspd, u10, v10, gsw, glw, tsurf_wat, &
Expand All @@ -118,15 +118,13 @@ subroutine gfdl_sfc_layer_run (im, nsoil, km, xlat, xlon, flag_iter, lsm, &
use namelist_soilveg, only: maxsmc_noah => maxsmc, drysmc_noah => drysmc
use namelist_soilveg_ruc, only: maxsmc_ruc => maxsmc, drysmc_ruc => drysmc
use noahmp_tables, only: maxsmc_noahmp => smcmax_table, drysmc_noahmp => smcdry_table
use module_sf_noahlsm, only: maxsmc_noah_wrfv4 => maxsmc, drysmc_noah_wrfv4 => drysmc
!################################################################################################

implicit none

integer, intent(in) :: im, nsoil, km, ivegsrc
integer, intent(in) :: lsm, lsm_noah, lsm_noahmp, &
lsm_ruc, lsm_noah_wrfv4, icoef_sf,&
ntsflg
lsm_ruc, icoef_sf, ntsflg
logical, intent(in) :: cplwav, cplwav2atm !GJF: this scheme has not been tested with these on
logical, intent(in) :: lcurr_sf !GJF: this scheme has not been tested with this option turned on; the variables scurx and scury need to be input in order to use this
logical, intent(in) :: pert_Cd !GJF: this scheme has not been tested with this option turned on; the variables ens_random_seed and ens_Cdamp need to be input in order to use this
Expand Down Expand Up @@ -195,9 +193,6 @@ subroutine gfdl_sfc_layer_run (im, nsoil, km, xlat, xlon, flag_iter, lsm, &
else if (lsm == lsm_ruc) then
maxsmc = maxsmc_ruc
drysmc = drysmc_ruc
else if (lsm == lsm_noah_wrfv4) then
maxsmc = maxsmc_noah_wrfv4
drysmc = drysmc_noah_wrfv4
else
!GJF: These data were from the original GFDL surface layer scheme, but
! rather than being hard-coded here, they should be shared with the
Expand Down
7 changes: 0 additions & 7 deletions physics/gfdl_sfc_layer.meta
Original file line number Diff line number Diff line change
Expand Up @@ -148,13 +148,6 @@
dimensions = ()
type = integer
intent = in
[lsm_noah_wrfv4]
standard_name = identifier_for_noah_wrfv4_land_surface_scheme
long_name = flag for NOAH WRFv4 land surface model
units = flag
dimensions = ()
type = integer
intent = in
[icoef_sf]
standard_name = flag_for_surface_roughness_option_over_water
long_name = surface roughness options over water
Expand Down
4 changes: 2 additions & 2 deletions physics/module_mp_thompson.F90
Original file line number Diff line number Diff line change
Expand Up @@ -1472,8 +1472,8 @@ SUBROUTINE mp_gt_driver(qv, qc, qr, qi, qs, qg, ni, nr, nc, &
!.. Changed 13 May 2013 to fake emissions in which nwfa2d is aerosol
!.. number tendency (number per kg per second).
if (is_aerosol_aware) then
nwfa1d(kts) = nwfa1d(kts) + nwfa2d(i,j)*dt_in
nifa1d(kts) = nifa1d(kts) + nifa2d(i,j)*dt_in
nwfa1d(kts) = nwfa1d(kts) + nwfa2d(i,j)*dt
nifa1d(kts) = nifa1d(kts) + nifa2d(i,j)*dt

do k = kts, kte
nc(i,k,j) = nc1d(k)
Expand Down
Loading

0 comments on commit 1c0776a

Please sign in to comment.