NCEPLIBS-ip  5.0.0
ip_station_points_grid_mod.F90
Go to the documentation of this file.
1 
5 
11  use ip_grid_mod
12  implicit none
13 
14  ! Not really a grid
15  private
16  public :: ip_station_points_grid
17 
18  type, extends(ip_grid) :: ip_station_points_grid
19  contains
21  procedure :: init_grib1
23  procedure :: init_grib2
26  procedure :: gdswzd => gdswzd_station_points
27  end type ip_station_points_grid
28 
29 contains
30 
37  subroutine init_grib1(self, g1_desc)
38  class(ip_station_points_grid), intent(inout) :: self
39  type(grib1_descriptor), intent(in) :: g1_desc
40  end subroutine init_grib1
41 
48  subroutine init_grib2(self, g2_desc)
49  class(ip_station_points_grid), intent(inout) :: self
50  type(grib2_descriptor), intent(in) :: g2_desc
51  end subroutine init_grib2
52 
75  SUBROUTINE gdswzd_station_points(self,IOPT,NPTS, &
76  FILL,XPTS,YPTS,RLON,RLAT,NRET, &
77  CROT,SROT,XLON,XLAT,YLON,YLAT,AREA)
78  class(ip_station_points_grid), intent(in) :: self
79  INTEGER, INTENT(IN ) :: IOPT, NPTS
80  INTEGER, INTENT( OUT) :: NRET
81  !
82  REAL, INTENT(IN ) :: FILL
83  REAL, INTENT(INOUT) :: RLON(NPTS),RLAT(NPTS)
84  REAL, INTENT(INOUT) :: XPTS(NPTS),YPTS(NPTS)
85  REAL, OPTIONAL, INTENT( OUT) :: CROT(NPTS),SROT(NPTS)
86  REAL, OPTIONAL, INTENT( OUT) :: XLON(NPTS),XLAT(NPTS)
87  REAL, OPTIONAL, INTENT( OUT) :: YLON(NPTS),YLAT(NPTS),AREA(NPTS)
88 
89  ! This is all that needs to be done for GDSWZD for station points.
90  nret = npts
91 
92  end subroutine gdswzd_station_points
93 
void gdswzd(int igdtnum, int *igdtmpl, int igdtlen, int iopt, int npts, float fill, float *xpts, float *ypts, float *rlon, float *rlat, int *nret, float *crot, float *srot, float *xlon, float *xlat, float *ylon, float *ylat, float *area)
gdswzd() interface for C for _4 build of library.
Users derived type grid descriptor objects to abstract away the raw GRIB1 and GRIB2 grid definitions.
Abstract ip_grid type.
Definition: ip_grid_mod.F90:10
Interpolate gridded data to a series of station points.
subroutine init_grib1(self, g1_desc)
Initializes an IP Station grid given a grib1_descriptor object.
subroutine gdswzd_station_points(self, IOPT, NPTS, FILL, XPTS, YPTS, RLON, RLAT, NRET, CROT, SROT, XLON, XLAT, YLON, YLAT, AREA)
Interpolate gridded data to a series of station points.
subroutine init_grib2(self, g2_desc)
Initializes an IP Station grid given a grib2_descriptor object.
Descriptor representing a grib1 grib descriptor section (GDS) with an integer array.
Grib-2 descriptor containing a grib2 GDT represented by an integer array.
Abstract grid that holds fields and methods common to all grids.
Definition: ip_grid_mod.F90:52