Skip to content

Commit

Permalink
try --whitespace 0
Browse files Browse the repository at this point in the history
  • Loading branch information
AlexanderRichert-NOAA committed Mar 5, 2024
1 parent bce9670 commit 9555b54
Show file tree
Hide file tree
Showing 32 changed files with 6,007 additions and 6,007 deletions.
708 changes: 354 additions & 354 deletions src/bicubic_interp_mod.F90

Large diffs are not rendered by default.

644 changes: 322 additions & 322 deletions src/bilinear_interp_mod.F90

Large diffs are not rendered by default.

922 changes: 461 additions & 461 deletions src/budget_interp_mod.F90

Large diffs are not rendered by default.

94 changes: 47 additions & 47 deletions src/earth_radius_mod.F90
Original file line number Diff line number Diff line change
Expand Up @@ -37,60 +37,60 @@ module earth_radius_mod
!> @param[out] eccen_squared real earth eccentricity squared
!>
!> @author Gayno @date 2015-07-14
subroutine earth_radius(igdtmpl, igdtlen, radius, eccen_squared)
subroutine earth_radius(igdtmpl,igdtlen,radius,eccen_squared)
implicit none

integer, intent(in) :: igdtlen
integer, intent(in) :: igdtmpl(igdtlen)
integer,intent(in) :: igdtlen
integer,intent(in) :: igdtmpl(igdtlen)

real, intent(out) :: eccen_squared
real, intent(out) :: radius
real,intent(out) :: eccen_squared
real,intent(out) :: radius

real :: flat
real :: major_axis, minor_axis
real :: major_axis,minor_axis

select case (igdtmpl(1))
case (0)
radius = 6367470.0
eccen_squared = 0.0
case (1) ! USER SPECIFIED SPHERICAL
radius = float(igdtmpl(3))/float(10**igdtmpl(2))
eccen_squared = 0.0
case (2) ! IAU 1965
radius = 6378160.0 ! SEMI MAJOR AXIS
flat = 1.0/297.0 ! FLATTENING
eccen_squared = (2.0*flat)-(flat**2)
case (3) ! USER SPECIFIED ELLIPTICAL (KM)
major_axis = float(igdtmpl(5))/float(10**igdtmpl(4))
major_axis = major_axis*1000.0
minor_axis = float(igdtmpl(7))/float(10**igdtmpl(6))
minor_axis = minor_axis*1000.0
eccen_squared = 1.0-(minor_axis**2/major_axis**2)
radius = major_axis
case (4) ! IAG-GRS80 MODEL
radius = 6378137.0 ! SEMI MAJOR AXIS
flat = 1.0/298.2572 ! FLATTENING
eccen_squared = (2.0*flat)-(flat**2)
case (5) ! WGS84 DATUM
radius = 6378137.0 ! SEMI MAJOR AXIS
eccen_squared = 0.00669437999013
case (6)
radius = 6371229.0
eccen_squared = 0.0
case (7) ! USER SPECIFIED ELLIPTICAL (M)
major_axis = float(igdtmpl(5))/float(10**igdtmpl(4))
minor_axis = float(igdtmpl(7))/float(10**igdtmpl(6))
eccen_squared = 1.0-(minor_axis**2/major_axis**2)
radius = major_axis
case (8)
radius = 6371200.0
eccen_squared = 0.0
select case(igdtmpl(1))
case(0)
radius=6367470.0
eccen_squared=0.0
case(1) ! USER SPECIFIED SPHERICAL
radius=float(igdtmpl(3))/float(10**igdtmpl(2))
eccen_squared=0.0
case(2) ! IAU 1965
radius=6378160.0 ! SEMI MAJOR AXIS
flat=1.0/297.0 ! FLATTENING
eccen_squared=(2.0*flat)-(flat**2)
case(3) ! USER SPECIFIED ELLIPTICAL (KM)
major_axis=float(igdtmpl(5))/float(10**igdtmpl(4))
major_axis=major_axis*1000.0
minor_axis=float(igdtmpl(7))/float(10**igdtmpl(6))
minor_axis=minor_axis*1000.0
eccen_squared=1.0-(minor_axis**2/major_axis**2)
radius=major_axis
case(4) ! IAG-GRS80 MODEL
radius=6378137.0 ! SEMI MAJOR AXIS
flat=1.0/298.2572 ! FLATTENING
eccen_squared=(2.0*flat)-(flat**2)
case(5) ! WGS84 DATUM
radius=6378137.0 ! SEMI MAJOR AXIS
eccen_squared=0.00669437999013
case(6)
radius=6371229.0
eccen_squared=0.0
case(7) ! USER SPECIFIED ELLIPTICAL (M)
major_axis=float(igdtmpl(5))/float(10**igdtmpl(4))
minor_axis=float(igdtmpl(7))/float(10**igdtmpl(6))
eccen_squared=1.0-(minor_axis**2/major_axis**2)
radius=major_axis
case(8)
radius=6371200.0
eccen_squared=0.0
case default
radius = -9999.
eccen_squared = -9999.
end select
radius=-9999.
eccen_squared=-9999.
endselect
!
return
!
end subroutine earth_radius
end module earth_radius_mod
endsubroutine earth_radius
endmodule earth_radius_mod
94 changes: 47 additions & 47 deletions src/gdswzd_c.F90
Original file line number Diff line number Diff line change
Expand Up @@ -170,44 +170,44 @@ module gdswzd_c_mod
!> square of the map factor in the case of conformal projections.)
!>
!> @author JOVIC @date 2016-04-10
subroutine gdswzd_c(igdtnum, igdtmpl, igdtlen, iopt, npts, fill, &
xpts, ypts, rlon, rlat, nret, crot, srot, &
xlon, xlat, ylon, ylat, area) bind(c, name='gdswzd')
use, intrinsic :: iso_c_binding
subroutine gdswzd_c(igdtnum,igdtmpl,igdtlen,iopt,npts,fill, &
xpts,ypts,rlon,rlat,nret,crot,srot, &
xlon,xlat,ylon,ylat,area) bind(c,name='gdswzd')
use,intrinsic :: iso_c_binding

use gdswzd_mod

implicit none

#if (LSIZE==8)
integer(KIND=c_long), intent(in) :: igdtmpl(igdtlen)
integer(KIND=c_long), value, intent(in) :: igdtnum, igdtlen
integer(KIND=c_long), value, intent(in) :: iopt, npts
integer(KIND=c_long), intent(out) :: nret
integer(KIND=c_long),intent(in) :: igdtmpl(igdtlen)
integer(KIND=c_long),value,intent(in) :: igdtnum,igdtlen
integer(KIND=c_long),value,intent(in) :: iopt,npts
integer(KIND=c_long),intent(out) :: nret
#else
integer(KIND=c_int), intent(in) :: igdtmpl(igdtlen)
integer(KIND=c_int), value, intent(in) :: igdtnum, igdtlen
integer(KIND=c_int), value, intent(in) :: iopt, npts
integer(KIND=c_int), intent(out) :: nret
integer(KIND=c_int),intent(in) :: igdtmpl(igdtlen)
integer(KIND=c_int),value,intent(in) :: igdtnum,igdtlen
integer(KIND=c_int),value,intent(in) :: iopt,npts
integer(KIND=c_int),intent(out) :: nret
#endif

#if (LSIZE==4)
real(KIND=c_float), value, intent(in) :: fill
real(KIND=c_float), intent(inout) :: xpts(npts), ypts(npts), rlon(npts), rlat(npts)
real(KIND=c_float), intent(out) :: crot(npts), srot(npts), xlon(npts), xlat(npts)
real(KIND=c_float), intent(out) :: ylon(npts), ylat(npts), area(npts)
real(KIND=c_float),value,intent(in) :: fill
real(KIND=c_float),intent(inout) :: xpts(npts),ypts(npts),rlon(npts),rlat(npts)
real(KIND=c_float),intent(out) :: crot(npts),srot(npts),xlon(npts),xlat(npts)
real(KIND=c_float),intent(out) :: ylon(npts),ylat(npts),area(npts)
#else
real(KIND=c_double), value, intent(in) :: fill
real(KIND=c_double), intent(inout) :: xpts(npts), ypts(npts), rlon(npts), rlat(npts)
real(KIND=c_double), intent(out) :: crot(npts), srot(npts), xlon(npts), xlat(npts)
real(KIND=c_double), intent(out) :: ylon(npts), ylat(npts), area(npts)
real(KIND=c_double),value,intent(in) :: fill
real(KIND=c_double),intent(inout) :: xpts(npts),ypts(npts),rlon(npts),rlat(npts)
real(KIND=c_double),intent(out) :: crot(npts),srot(npts),xlon(npts),xlat(npts)
real(KIND=c_double),intent(out) :: ylon(npts),ylat(npts),area(npts)
#endif

call gdswzd(igdtnum, igdtmpl, igdtlen, iopt, npts, fill, &
xpts, ypts, rlon, rlat, nret, &
crot, srot, xlon, xlat, ylon, ylat, area)
call gdswzd(igdtnum,igdtmpl,igdtlen,iopt,npts,fill, &
xpts,ypts,rlon,rlat,nret, &
crot,srot,xlon,xlat,ylon,ylat,area)

end subroutine gdswzd_c
endsubroutine gdswzd_c

!> C wrapper for routine gdswzd.
!> Use this routine to call 'gdswzd' from a C or C++ program.
Expand Down Expand Up @@ -256,41 +256,41 @@ end subroutine gdswzd_c
!> square of the map factor in the case of conformal projections.)
!>
!> @author JOVIC @date 2016-04-10
subroutine gdswzd_c_grib1(kgds, iopt, npts, fill, xpts, ypts, rlon, rlat, nret, &
crot, srot, xlon, xlat, ylon, ylat, area) bind(c, name='gdswzd_grib1')
use, intrinsic :: iso_c_binding
subroutine gdswzd_c_grib1(kgds,iopt,npts,fill,xpts,ypts,rlon,rlat,nret, &
crot,srot,xlon,xlat,ylon,ylat,area) bind(c,name='gdswzd_grib1')
use,intrinsic :: iso_c_binding

use gdswzd_mod

implicit none

#if (LSIZE==8)
integer(KIND=c_long), intent(in) :: kgds(200)
integer(KIND=c_long), value, intent(in) :: iopt
integer(KIND=c_long), value, intent(in) :: npts
integer(KIND=c_long), intent(out) :: nret
integer(KIND=c_long),intent(in) :: kgds(200)
integer(KIND=c_long),value,intent(in) :: iopt
integer(KIND=c_long),value,intent(in) :: npts
integer(KIND=c_long),intent(out) :: nret
#else
integer(KIND=c_int), intent(in) :: kgds(200)
integer(KIND=c_int), value, intent(in) :: iopt
integer(KIND=c_int), value, intent(in) :: npts
integer(KIND=c_int), intent(out) :: nret
integer(KIND=c_int),intent(in) :: kgds(200)
integer(KIND=c_int),value,intent(in) :: iopt
integer(KIND=c_int),value,intent(in) :: npts
integer(KIND=c_int),intent(out) :: nret
#endif

#if (LSIZE==4)
real(KIND=c_float), value, intent(in) :: fill
real(KIND=c_float), intent(inout) :: xpts(npts), ypts(npts), rlon(npts), rlat(npts)
real(KIND=c_float), intent(out) :: crot(npts), srot(npts), xlon(npts), xlat(npts)
real(KIND=c_float), intent(out) :: ylon(npts), ylat(npts), area(npts)
real(KIND=c_float),value,intent(in) :: fill
real(KIND=c_float),intent(inout) :: xpts(npts),ypts(npts),rlon(npts),rlat(npts)
real(KIND=c_float),intent(out) :: crot(npts),srot(npts),xlon(npts),xlat(npts)
real(KIND=c_float),intent(out) :: ylon(npts),ylat(npts),area(npts)
#else
real(KIND=c_double), value, intent(in) :: fill
real(KIND=c_double), intent(inout) :: xpts(npts), ypts(npts), rlon(npts), rlat(npts)
real(KIND=c_double), intent(out) :: crot(npts), srot(npts), xlon(npts), xlat(npts)
real(KIND=c_double), intent(out) :: ylon(npts), ylat(npts), area(npts)
real(KIND=c_double),value,intent(in) :: fill
real(KIND=c_double),intent(inout) :: xpts(npts),ypts(npts),rlon(npts),rlat(npts)
real(KIND=c_double),intent(out) :: crot(npts),srot(npts),xlon(npts),xlat(npts)
real(KIND=c_double),intent(out) :: ylon(npts),ylat(npts),area(npts)
#endif

call gdswzd(kgds, iopt, npts, fill, xpts, ypts, rlon, rlat, nret, &
crot, srot, xlon, xlat, ylon, ylat, area)
call gdswzd(kgds,iopt,npts,fill,xpts,ypts,rlon,rlat,nret, &
crot,srot,xlon,xlat,ylon,ylat,area)

end subroutine gdswzd_c_grib1
endsubroutine gdswzd_c_grib1

end module gdswzd_c_mod
endmodule gdswzd_c_mod
Loading

0 comments on commit 9555b54

Please sign in to comment.