Skip to content

Commit

Permalink
removed w3emc changes, this is fixed with a different method in an up…
Browse files Browse the repository at this point in the history
…coming PR
  • Loading branch information
scrasmussen committed May 9, 2024
1 parent e0e6946 commit effeeb8
Show file tree
Hide file tree
Showing 8 changed files with 0 additions and 101 deletions.
1 change: 0 additions & 1 deletion physics/GWD/cires_tauamf_data.F90
Original file line number Diff line number Diff line change
Expand Up @@ -166,7 +166,6 @@ end subroutine tau_amf_interp
subroutine gfs_idate_calendar(idate, fhour, ddd, fddd)

use machine, only: kind_phys
use w3emc, only: w3movdat
implicit none
! input
integer, intent(in) :: idate(4)
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -70,7 +70,6 @@ subroutine GFS_time_vary_pre_timestep_init (jdat, idat, dtp, nsswr, &
julian, yearlen, ipt, lprnt, lssav, lsswr, lslwr, solhr, errmsg, errflg)

use machine, only: kind_phys, kind_dbl_prec, kind_sngl_prec
use w3emc, only: w3difdat

implicit none

Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,6 @@
type = scheme
relative_path = ../../
dependencies = tools/funcphys.f90,hooks/machine.F
ay to get rid of all the warnings.):physics/GFS_time_vary_pre.scm.meta

########################################################################
[ccpp-arg-table]
Expand Down
1 change: 0 additions & 1 deletion physics/Interstitials/UFS_SCM_NEPTUNE/iccninterp.F90
Original file line number Diff line number Diff line change
Expand Up @@ -130,7 +130,6 @@ SUBROUTINE ciinterpol(me,npts,IDATE,FHOUR,jindx1,jindx2,ddy, &
!
USE MACHINE, ONLY : kind_phys
use iccn_def
use w3emc, only: w3movdat
implicit none
integer i1,i2, iday,j,j1,j2,l,npts,nc,n1,n2,lev,k,i
real(kind=kind_phys) fhour,temj, tx1, tx2,temi
Expand Down
2 changes: 0 additions & 2 deletions physics/Interstitials/UFS_SCM_NEPTUNE/sfcsub.F
Original file line number Diff line number Diff line change
Expand Up @@ -7082,7 +7082,6 @@ subroutine clima(lugb,iy,im,id,ih,fh,len,lsoil,slmskl,slmskw, &
&, tile_num_ch, i_index, j_index)
!
use machine , only : kind_io8,kind_io4
use w3emc, only: w3movdat
implicit none
character(len=*), intent(in) :: tile_num_ch
integer, intent(in) :: i_index(len), j_index(len)
Expand Down Expand Up @@ -8612,7 +8611,6 @@ subroutine fixrda(lugb,fngrib,kpds5,slmask, &
&, outlat, outlon, me)
use machine , only : kind_io8,kind_dbl_prec,kind_sngl_prec
use sfccyc_module, only : mdata
use w3emc, only: w3movdat
implicit none
integer nrepmx,nvalid,imo,iyr,idy,jret,ihr,nrept,lskip,lugi, &
& lgrib,j,ndata,i,inttyp,jmax,imax,ijmax,ij,jday,len,iret, &
Expand Down
1 change: 0 additions & 1 deletion physics/MP/Morrison_Gettelman/aerinterp.F90
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,6 @@
!! This module contain subroutines of reading and interpolating
!! aerosol data for MG microphysics.
module aerinterp
use w3emc, only: w3movdat
implicit none

private read_netfaer
Expand Down
1 change: 0 additions & 1 deletion physics/photochem/h2ointerp.f90
Original file line number Diff line number Diff line change
Expand Up @@ -133,7 +133,6 @@ subroutine h2ointerpol(me,npts,idate,fhour,jindx1,jindx2,h2oplout,ddy)
!
use machine , only : kind_phys
use h2o_def
use w3emc, only: w3movdat
implicit none
integer j,j1,j2,l,npts,nc,n1,n2
real(kind=kind_phys) fhour,tem, tx1, tx2
Expand Down
93 changes: 0 additions & 93 deletions physics/w3emc_wrapper.F90

This file was deleted.

0 comments on commit effeeb8

Please sign in to comment.