parse_proj <- function(x, lab = "proj") {
l <- strsplit(as.character(x), "\\+")
p <- gsub(sprintf("%s=", lab), "", unlist(lapply(l, function(a) grep(sprintf("^%s", lab), a, value = TRUE))))
p
}
e <- rgdal::make_EPSG()
allfamily <- parse_proj(e$prj4)
ufamily_proj <- as.character(e$prj4)[unlist(lapply(split(seq_along(allfamily), allfamily), function(x) sample(x, min(c(5, length(x))))))]
ufamily_proj <- na.omit(ufamily_proj)
Map points.
library(maptools)
## Loading required package: sp
## Checking rgeos availability: TRUE
data(wrld_simpl)
library(spbabel)
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
pts <- sptable(wrld_simpl) %>% select(x_, y_)
library(rgdal)
## rgdal: version: 1.2-5, (SVN revision 648)
## Geospatial Data Abstraction Library extensions to R successfully loaded
## Loaded GDAL runtime: GDAL 2.1.2, released 2016/10/24
## Path to GDAL shared files: /usr/share/gdal/2.1
## Loaded PROJ.4 runtime: Rel. 4.9.3, 15 August 2016, [PJ_VERSION: 493]
## Path to PROJ.4 shared files: (autodetected)
## Linking to sp version: 1.2-3
library(spex)
mpts <- as.matrix(pts)[sample(nrow(pts), 2000), ]
for (i in seq_along(ufamily_proj)) {
print(i)
iproj <- ufamily_proj[i]
apts <- rgdal::project(mpts, iproj)
apts <- apts[(is.finite(apts[, 1]) | is.finite(apts[, 2])), ]
if (nrow(apts) > 2L) {
## see rbgm for nicer plotting here
plot(apts, pch = 19, cex = 0.3, main = iproj, cex.main = 0.75, asp = 1)
print(CRS(iproj))
plot(graticule:::auto_graticule(SpatialPoints(apts, proj4string = CRS(iproj))), add = TRUE)
} else {
print("no can do")
print(iproj)
}
}
## [1] 1
## CRS arguments:
## +proj=stere +lat_0=-90 +lat_ts=-80.23861111111111 +lon_0=165 +k=1
## +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs +ellps=WGS84
## +towgs84=0,0,0
## [1] 2
## Warning in rgdal::project(mpts, iproj): 945 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=43.5 +lon_0=-69.125 +k=0.99998 +x_0=500000
## +y_0=0 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 3
## CRS arguments:
## +proj=lcc +lat_1=41.66666666666666 +lat_2=40
## +lat_0=39.33333333333334 +lon_0=-122 +x_0=2000000 +y_0=500000
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 4
## CRS arguments:
## +proj=cass +lat_0=52.41864827777778 +lon_0=13.62720366666667
## +x_0=40000 +y_0=10000 +datum=potsdam +units=m +no_defs
## +ellps=bessel +towgs84=598.1,73.7,418.2,0.202,0.045,-2.455,6.7
## [1] 5
## Warning in rgdal::project(mpts, iproj): 1067 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=36.66666666666666 +lon_0=-88.33333333333333
## +k=0.9999749999999999 +x_0=300000.0000000001 +y_0=0 +ellps=GRS80
## +towgs84=0,0,0,0,0,0,0 +units=us-ft +no_defs
## [1] 6
## CRS arguments:
## +proj=lcc +lat_1=36.16666666666666 +lat_2=34.33333333333334
## +lat_0=33.75 +lon_0=-79 +x_0=609601.22 +y_0=0 +ellps=GRS80
## +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 7
## Warning in rgdal::project(mpts, iproj): 900 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=16 +k=0.9999 +x_0=500000 +y_0=10000000
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 8
## Warning in rgdal::project(mpts, iproj): 864 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=12 +k=0.9999 +x_0=500000 +y_0=10000000
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 9
## Warning in rgdal::project(mpts, iproj): 997 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=28.4 +k=0.9999400000000001 +x_0=200000
## +y_0=-5000000 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m
## +no_defs
## [1] 10
## Warning in rgdal::project(mpts, iproj): 920 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=18 +k=1 +x_0=500000 +y_0=0 +ellps=intl
## +towgs84=-96.062,-82.428,-121.753,4.801,0.345,-1.376,1.496
## +units=m +no_defs
## [1] 11
## Warning in rgdal::project(mpts, iproj): 1041 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=42.83333333333334 +lon_0=-123.3333333333333
## +k=1.000023 +x_0=50000 +y_0=0 +ellps=GRS80 +units=m +no_defs
## [1] 12
## Warning in rgdal::project(mpts, iproj): 54 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=38 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m
## +no_defs
## [1] 13
## CRS arguments:
## +proj=lcc +lat_1=18.43333333333333 +lat_2=18.03333333333333
## +lat_0=17.83333333333333 +lon_0=-66.43333333333334
## +x_0=152400.3048006096 +y_0=0 +ellps=clrk66
## +towgs84=11,72,-101,0,0,0,0 +units=us-ft +no_defs
## [1] 14
## CRS arguments:
## +proj=lcc +lat_1=18.43333333333333 +lat_2=18.03333333333333
## +lat_0=17.83333333333333 +lon_0=-66.43333333333334
## +x_0=152400.3048006096 +y_0=30480.06096012192 +ellps=clrk66
## +towgs84=11,72,-101,0,0,0,0 +units=us-ft +no_defs
## [1] 15
## CRS arguments:
## +proj=lcc +lat_1=-54 +lat_2=-54.75 +lat_0=-55 +lon_0=-37 +x_0=0
## +y_0=0 +datum=WGS84 +units=m +no_defs +ellps=WGS84 +towgs84=0,0,0
## [1] 16
## Warning in rgdal::project(mpts, iproj): 7 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=50 +south +ellps=WGS72
## +towgs84=0,0,1.9,0,0,0.814,-0.38 +units=m +no_defs
## [1] 17
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=51 +south +ellps=WGS72
## +towgs84=0,0,1.9,0,0,0.814,-0.38 +units=m +no_defs
## [1] 18
## CRS arguments:
## +proj=geocent +ellps=WGS84 +units=m +no_defs
## [1] 19
## CRS arguments:
## +proj=geocent +ellps=GRS80 +units=m +no_defs
## [1] 20
## CRS arguments:
## +proj=stere +lat_0=90 +lat_ts=90 +lon_0=0 +k=0.994 +x_0=2000000
## +y_0=2000000 +datum=WGS84 +units=m +no_defs +ellps=WGS84
## +towgs84=0,0,0
## [1] 21
## Warning in rgdal::project(mpts, iproj): 5 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=23 +south +datum=WGS84 +units=m +no_defs
## +ellps=WGS84 +towgs84=0,0,0
## [1] 22
## CRS arguments:
## +proj=geocent +ellps=GRS80 +units=m +no_defs
## [1] 23
## Warning in rgdal::project(mpts, iproj): 7 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=20 +south +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 24
## Warning in rgdal::project(mpts, iproj): 9 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=19 +south +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 25
## CRS arguments:
## +proj=krovak +lat_0=49.5 +lon_0=42.5 +k=0.9999 +x_0=0 +y_0=0
## +ellps=bessel +towgs84=589,76,480,0,0,0,0 +pm=ferro +units=m
## +no_defs
## [1] 26
## Warning in rgdal::project(mpts, iproj): 1002 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=58 +lon_0=27.5 +k=1 +x_0=100000 +y_0=1000000
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 27
## CRS arguments:
## +proj=lcc +lat_1=37.93333333333333 +lat_2=36.73333333333333
## +lat_0=36.33333333333334 +lon_0=-85.75 +x_0=500000 +y_0=500000
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 28
## CRS arguments:
## +proj=lcc +lat_1=32.66666666666666 +lat_2=31.16666666666667
## +lat_0=30.5 +lon_0=-92.5 +x_0=1000000 +y_0=0 +ellps=GRS80
## +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 29
## Warning in rgdal::project(mpts, iproj): 1000 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=27 +k=1 +x_0=500000 +y_0=0
## +ellps=krass +towgs84=25,-141,-78.5,0,0.35,0.736,0 +units=m
## +no_defs
## [1] 30
## CRS arguments:
## +proj=laea +lat_0=45 +lon_0=-100 +x_0=0 +y_0=0 +a=6370997
## +b=6370997 +units=m +no_defs
## Warning in rgdal::project(coordinates(r), proj, inv = TRUE): 14189
## projected point(s) not finite
## [1] 31
## Warning in rgdal::project(mpts, iproj): 971 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=23.25 +k=1 +x_0=150000 +y_0=0
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 32
## CRS arguments:
## +proj=lcc +lat_1=-68.66666666666667 +lat_2=-71.33333333333333
## +lat_0=-90 +lon_0=54 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs
## +ellps=WGS84 +towgs84=0,0,0
## [1] 33
## Warning in rgdal::project(mpts, iproj): 845 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=6 +k=1 +x_0=2500000 +y_0=0
## +datum=potsdam +units=m +no_defs +ellps=bessel
## +towgs84=598.1,73.7,418.2,0.202,0.045,-2.455,6.7
## [1] 34
## CRS arguments:
## +proj=lcc +lat_1=-72.66666666666667 +lat_2=-75.33333333333333
## +lat_0=-90 +lon_0=9 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs
## +ellps=WGS84 +towgs84=0,0,0
## [1] 35
## Warning in rgdal::project(mpts, iproj): 1068 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=34.75 +lon_0=-116.6666666666667 +k=0.9999
## +x_0=500000.00001016 +y_0=6000000 +ellps=GRS80
## +towgs84=0,0,0,0,0,0,0 +units=us-ft +no_defs
## [1] 36
## CRS arguments:
## +proj=sterea +lat_0=45.9 +lon_0=25.39246588888889 +k=0.9996667
## +x_0=500000 +y_0=500000 +ellps=intl
## +towgs84=103.25,-100.4,-307.19,0,0,0,0 +units=m +no_defs
## [1] 37
## CRS arguments:
## +proj=longlat +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +no_defs
## [1] 38
## CRS arguments:
## +proj=longlat +ellps=intl +towgs84=-156,-271,-189,0,0,0,0 +no_defs
## [1] 39
## CRS arguments:
## +proj=longlat +ellps=WGS84 +towgs84=-56.263,16.136,-22.856,0,0,0,0
## +no_defs
## [1] 40
## CRS arguments:
## +proj=longlat +ellps=intl +towgs84=217.037,86.959,23.956,0,0,0,0
## +no_defs
## [1] 41
## CRS arguments:
## +proj=longlat +ellps=clrk80 +towgs84=-77,-128,142,0,0,0,0 +no_defs
## [1] 42
## Warning in rgdal::project(mpts, iproj): 978 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=24 +k=1 +x_0=8500000 +y_0=0
## +ellps=krass +towgs84=25,-141,-78.5,0,0.35,0.736,0 +units=m
## +no_defs
## [1] 43
## Warning in rgdal::project(mpts, iproj): 1000 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=42 +k=1 +x_0=14500000 +y_0=0
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 44
## Warning in rgdal::project(mpts, iproj): 992 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=26 +k=0.9999 +x_0=500000 +y_0=10000000
## +ellps=clrk80 +units=m +no_defs
## [1] 45
## CRS arguments:
## +proj=lcc +lat_1=42.25 +lat_2=43.75 +lat_0=43 +lon_0=3
## +x_0=1700000 +y_0=2200000 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 46
## CRS arguments:
## +proj=lcc +lat_1=41.7 +lat_2=40.43333333333333
## +lat_0=39.66666666666666 +lon_0=-82.5 +x_0=600000 +y_0=0
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=us-ft +no_defs
## [1] 47
## Warning in rgdal::project(mpts, iproj): 880 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=15 +k=1 +x_0=500000 +y_0=0
## +ellps=krass +towgs84=23.92,-141.27,-80.9,0,0.35,0.82,-0.12
## +units=m +no_defs
## [1] 48
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=21 +ellps=intl +towgs84=-288,175,-376,0,0,0,0
## +units=m +no_defs
## [1] 49
## Warning in rgdal::project(mpts, iproj): 997 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0.1 +lon_0=27.95 +k=1 +x_0=2250000 +y_0=0
## +ellps=krass +towgs84=23.92,-141.27,-80.9,0,0.35,0.82,-0.12
## +units=m +no_defs
## [1] 50
## Warning in rgdal::project(mpts, iproj): 16 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=58 +south +ellps=intl
## +towgs84=-11.64,-348.6,291.98,0,0,0,0 +units=m +no_defs
## [1] 51
## Warning in rgdal::project(mpts, iproj): 46 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=4 +ellps=GRS80 +units=m +no_defs
## [1] 52
## CRS arguments:
## +proj=omerc +lat_0=27.51882880555555 +lonc=52.60353916666667
## +alpha=0.5716611944444444 +k=0.999895934 +x_0=658377.437
## +y_0=3044969.194 +gamma=0.5716611944444444 +ellps=intl
## +towgs84=-133.63,-157.5,-158.62,0,0,0,0 +units=m +no_defs
## [1] 53
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=21 +south +ellps=WGS84 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 54
## Warning in rgdal::project(mpts, iproj): 5 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=53 +south +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 55
## Warning in rgdal::project(mpts, iproj): 864 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=12 +k=1 +x_0=4500000 +y_0=0
## +ellps=bessel +units=m +no_defs
## [1] 56
## Warning in rgdal::project(mpts, iproj): 3 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=54 +south +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 57
## Warning in rgdal::project(mpts, iproj): 942 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=-90 +lon_0=-69 +k=1 +x_0=2500000 +y_0=0
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 58
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=51 +south +ellps=aust_SA
## +towgs84=-134,-48,149,0,0,0,0 +units=m +no_defs
## [1] 59
## Warning in rgdal::project(mpts, iproj): 5 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=53 +south +ellps=aust_SA
## +towgs84=-134,-48,149,0,0,0,0 +units=m +no_defs
## [1] 60
## CRS arguments:
## +proj=somerc +lat_0=46.95240555555556 +lon_0=7.439583333333333
## +k_0=1 +x_0=2600000 +y_0=1200000 +ellps=bessel
## +towgs84=674.374,15.056,405.346,0,0,0,0 +units=m +no_defs
## [1] 61
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=52 +south +ellps=aust_SA
## +towgs84=-134,-48,149,0,0,0,0 +units=m +no_defs
## [1] 62
## Warning in rgdal::project(mpts, iproj): 40 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=32 +south +ellps=clrk80
## +towgs84=-50.9,-347.6,-231,0,0,0,0 +units=m +no_defs
## [1] 63
## CRS arguments:
## +proj=lcc +lat_1=-76.66666666666667 +lat_2=-79.33333333333333
## +lat_0=-90 +lon_0=72 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs
## +ellps=WGS84 +towgs84=0,0,0
## [1] 64
## CRS arguments:
## +proj=lcc +lat_1=-76.66666666666667 +lat_2=-79.33333333333333
## +lat_0=-90 +lon_0=24 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs
## +ellps=WGS84 +towgs84=0,0,0
## [1] 65
## CRS arguments:
## +proj=lcc +lat_1=-72.66666666666667 +lat_2=-75.33333333333333
## +lat_0=-90 +lon_0=171 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs
## +ellps=WGS84 +towgs84=0,0,0
## [1] 66
## CRS arguments:
## +proj=lcc +lat_1=44.25 +lat_2=45.75 +lat_0=45 +lon_0=3
## +x_0=1700000 +y_0=4200000 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 67
## Warning in rgdal::project(mpts, iproj): 883 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=-90 +lon_0=-57 +k=1 +x_0=6500000 +y_0=0
## +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 68
## CRS arguments:
## +proj=sterea +lat_0=46.5 +lon_0=-66.5 +k=0.999912 +x_0=2500000
## +y_0=7500000 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 69
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=51 +south +ellps=GRS80 +towgs84=0,0,0,0,0,0,0
## +units=m +no_defs
## [1] 70
## Warning in rgdal::project(mpts, iproj): 6 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=21 +south +ellps=intl +units=m +no_defs
## [1] 71
## Warning in rgdal::project(mpts, iproj): 934 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=93 +k=1 +x_0=500000 +y_0=0
## +ellps=krass +towgs84=15.8,-154.4,-82.3,0,0,0,0 +units=m +no_defs
## [1] 72
## CRS arguments:
## +proj=sterea +lat_0=50.625 +lon_0=21.08333333333333 +k=0.9998
## +x_0=4637000 +y_0=5647000 +ellps=krass
## +towgs84=33.4,-146.6,-76.3,-0.359,-0.053,0.844,-0.84 +units=m
## +no_defs
## [1] 73
## Warning in rgdal::project(mpts, iproj): 1047 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=41.75 +lon_0=-121.75 +k=1.0002
## +x_0=79999.99999968 +y_0=0 +ellps=GRS80 +units=ft +no_defs
## [1] 74
## CRS arguments:
## +proj=lcc +lat_1=39.78333333333333 +lat_2=38.71666666666667
## +lat_0=38.33333333333334 +lon_0=-98 +x_0=399999.99998984 +y_0=0
## +ellps=GRS80 +units=us-ft +no_defs
## [1] 75
## Warning in rgdal::project(mpts, iproj): 937 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=72 +k=1 +x_0=24500000 +y_0=0
## +ellps=krass +towgs84=24.47,-130.89,-81.56,0,0,0.13,-0.22 +units=m
## +no_defs
## [1] 76
## Warning in rgdal::project(mpts, iproj): 1154 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=36 +lon_0=134.3333333333333 +k=0.9999 +x_0=0
## +y_0=0 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs
## [1] 77
## Warning in rgdal::project(mpts, iproj): 40 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=2 +datum=NAD27 +units=m +no_defs +ellps=clrk66
## +nadgrids=@conus,@alaska,@ntv2_0.gsb,@ntv1_can.dat
## [1] 78
## CRS arguments:
## +proj=lcc +lat_1=32.5 +lat_0=32.5 +lon_0=68 +k_0=0.99878641
## +x_0=2743195.5 +y_0=914398.5 +a=6377299.151 +b=6356098.145120132
## +towgs84=295,736,257,0,0,0,0 +units=m +no_defs
## [1] 79
## Warning in rgdal::project(mpts, iproj): 978 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=0 +lon_0=24 +k=1 +x_0=8500000 +y_0=0
## +datum=hermannskogel +units=m +no_defs +ellps=bessel
## +towgs84=577.326,90.129,463.919,5.137,1.474,5.297,2.4232
## [1] 80
## Warning in rgdal::project(mpts, iproj): 47 projected point(s) not finite
## CRS arguments:
## +proj=utm +zone=3 +ellps=WGS72 +towgs84=0,0,4.5,0,0,0.554,0.2263
## +units=m +no_defs
## [1] 81
## Warning in rgdal::project(mpts, iproj): 945 projected point(s) not finite
## CRS arguments:
## +proj=tmerc +lat_0=43 +lon_0=-69.125 +k=0.99998 +x_0=500000 +y_0=0
## +datum=NAD83 +units=m +no_defs +ellps=GRS80 +towgs84=0,0,0
## [1] 82
## CRS arguments:
## +proj=lcc +lat_1=83.66666666666667 +lat_2=80.33333333333333
## +lat_0=82.05842488888888 +lon_0=133 +x_0=28500000 +y_0=2500000
## +datum=WGS84 +units=m +no_defs +ellps=WGS84 +towgs84=0,0,0