Skip to content

Commit

Permalink
Bug fixes for newly added code in module_mp_thompson.F90 and mp_thomp…
Browse files Browse the repository at this point in the history
…son.F90
  • Loading branch information
climbfuji committed Oct 6, 2021
1 parent 1babf68 commit 1aa28fb
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 5 deletions.
2 changes: 1 addition & 1 deletion physics/module_mp_thompson.F90
Original file line number Diff line number Diff line change
Expand Up @@ -1181,7 +1181,7 @@ SUBROUTINE mp_gt_driver(qv, qc, qr, qi, qs, qg, ni, nr, nc, &
end if
else if (merra2_aerosol_aware .and. (.not.present(nc) .or. &
.not.present(nwfa) .or. &
.not.present(nifa) .or. )) then
.not.present(nifa) )) then
if (present(errmsg)) then
write(errmsg, '(*(a))') 'Logic error in mp_gt_driver: provide nc, nwfa, and nifa', &
' for merra2 aerosol-aware version of Thompson microphysics'
Expand Down
8 changes: 4 additions & 4 deletions physics/mp_thompson.F90
Original file line number Diff line number Diff line change
Expand Up @@ -125,7 +125,7 @@ subroutine mp_thompson_init(ncol, nlev, con_g, con_rd, con_eps, &
end if

if (is_aerosol_aware .and. merra2_aerosol_aware) then
write(errmsg,'(*(a))') "Logic error: Only one Thompson aerosol option can be true, either is_aerosol_aware or merra2_aerosol_aware)'
write(errmsg,'(*(a))') "Logic error: Only one Thompson aerosol option can be true, either is_aerosol_aware or merra2_aerosol_aware)"
errflg = 1
return
end if
Expand Down Expand Up @@ -546,7 +546,7 @@ subroutine mp_thompson_run(ncol, nlev, con_g, con_rd, &
return
else if (is_aerosol_aware .and. .not. (present(nc) .and. &
present(nwfa) .and. &
present(nifa) .and. )) then
present(nifa) )) then
write(errmsg,fmt='(*(a))') 'Logic error in mp_thompson_run:', &
' merra2 aerosol-aware microphysics require the', &
' following optional arguments: nc, nwfa, nifa'
Expand Down Expand Up @@ -981,8 +981,8 @@ subroutine get_niwfa(aerfld, nifa, nwfa, ncol, nlev)
nifa=(aerfld(:,:,1)/4.0737762+aerfld(:,:,2)/30.459203+aerfld(:,:,3)/153.45048+ &
aerfld(:,:,4)/1011.5142+ aerfld(:,:,5)/5683.3501)*1.e15
nwfa=((aerfld(:,:,6)/0.0045435214+aerfld(:,:,7)/0.2907854+aerfld(:,:,8)/12.91224+ &
aerfld(:,:,9)/206.2216+ aerfld(:,:,10)/4326.23)*1.+aerfld(:,:,11)/0.3053104*5+ &
+aerfld(:,:,15)/0.3232698*1)*1.e15
aerfld(:,:,9)/206.2216+ aerfld(:,:,10)/4326.23)*1.+aerfld(:,:,11)/0.3053104*5+ &
aerfld(:,:,15)/0.3232698*1)*1.e15
end subroutine get_niwfa

end module mp_thompson

0 comments on commit 1aa28fb

Please sign in to comment.