Skip to content

Commit

Permalink
Remove some unused variables.
Browse files Browse the repository at this point in the history
  • Loading branch information
George Gayno committed May 16, 2024
1 parent ca67706 commit b35dab8
Showing 1 changed file with 1 addition and 8 deletions.
9 changes: 1 addition & 8 deletions sorc/orog_mask_tools.fd/orog.fd/mtnlm7_oclsm.F
Original file line number Diff line number Diff line change
Expand Up @@ -182,7 +182,7 @@ SUBROUTINE TERSUB(IMN,JMN,IM,JM,NM,NR,NF0,NF1,NW,EFAC,
integer :: mskocn,notocn
integer :: i,j,nx,ny,ncid,js,jn,iw,ie,k,it,jt,error,id_dim
integer :: id_var,nx_in,ny_in,fsize,wgta,IN,INW,INE,IS,ISW,ISE
integer :: M,N,IMT,IRET,ios,latg2,istat,itest,jtest
integer :: M,N,IMT,ios,latg2,istat,itest,jtest
integer :: i_south_pole,j_south_pole,i_north_pole,j_north_pole
integer :: maxc3,maxc4,maxc5,maxc6,maxc7,maxc8
integer(1) :: i3save
Expand Down Expand Up @@ -226,7 +226,6 @@ SUBROUTINE TERSUB(IMN,JMN,IM,JM,NM,NR,NF0,NF1,NW,EFAC,
logical :: grid_from_file,fexist,opened
logical :: SPECTR, FILTER
logical :: is_south_pole(IM,JM), is_north_pole(IM,JM)
logical :: LB(IM*JM)
tbeg1=timef()
tbeg=timef()
Expand Down Expand Up @@ -4386,7 +4385,6 @@ function get_xnsum(lon1,lat1,lon2,lat2,IMN,JMN,
implicit none
real get_xnsum
logical verbose
real, intent(in) :: lon1,lat1,lon2,lat2,delxn
integer, intent(in) :: IMN,JMN
real, intent(in) :: glat(JMN)
Expand All @@ -4413,7 +4411,6 @@ function get_xnsum(lon1,lat1,lon2,lat2,IMN,JMN,
ien = lon2/delxn
if(ist .le.0) ist = ist + IMN
if(ien < ist) ien = ien + IMN
! if(verbose) print*, "ist,ien=",ist,ien,jst,jen
!--- compute average oro
oro = 0.0
Expand Down Expand Up @@ -4456,7 +4453,6 @@ function get_xnsum(lon1,lat1,lon2,lat2,IMN,JMN,
IF ( HEIGHT .gt. ORO ) get_xnsum = get_xnsum + 1
enddo
enddo
! if(verbose) print*, "get_xnsum=", get_xnsum, oro
end function get_xnsum
Expand Down Expand Up @@ -4492,7 +4488,6 @@ subroutine get_xnsum2(lon1,lat1,lon2,lat2,IMN,JMN,
implicit none
real, intent(out) :: xnsum1,xnsum2,HC
logical verbose
real lon1,lat1,lon2,lat2,delxn
integer IMN,JMN
real glat(JMN)
Expand All @@ -4519,7 +4514,6 @@ subroutine get_xnsum2(lon1,lat1,lon2,lat2,IMN,JMN,
ien = lon2/delxn
if(ist .le.0) ist = ist + IMN
if(ien < ist) ien = ien + IMN
! if(verbose) print*, "ist,ien=",ist,ien,jst,jen
!--- compute average oro
xnsum = 0
Expand Down Expand Up @@ -4615,7 +4609,6 @@ subroutine get_xnsum3(lon1,lat1,lon2,lat2,IMN,JMN,
ien = lon2/delxn
if(ist .le.0) ist = ist + IMN
if(ien < ist) ien = ien + IMN
! if(verbose) print*, "ist,ien=",ist,ien,jst,jen
xnsum1 = 0
xnsum2 = 0
Expand Down

0 comments on commit b35dab8

Please sign in to comment.