r - 如何在 R 中正确地将 map 添加到光栅图像

标签 r geospatial projection satellite-image

我正在尝试绘制海面温度数据并添加陆地的彩色图像,以便数据不会与NA混淆。我尝试了多种方法来做到这一点,但正如您将在下图中看到的那样, map 相对于数据没有正确排列。

为了使此问题可重现,这里有一个包含我正在使用的文件的保管箱的链接:https://www.dropbox.com/s/e8pwgmnhvw4s0nf/sst.nc4?dl=0

这是我迄今为止开发的代码;

library(ncdf4)
library(raster)
library(mapdata)
library(mapproj)
library(rgeos)
library(ggplot2)

通过 ncdf4、rasterToPoints、map_data 和 ggplot2

eight = nc_open("Downloads/sst.nc4")
sst = ncvar_get(eight, "sst")
sst = raster(sst)
sst = t(flip(sst, 1)) # have to orient the data properly

# extract the dimensions and set the extent
lat.min = min(eight$dim$lat$vals)
lat.max = max(eight$dim$lat$vals)
lon.min = min(eight$dim$lon$vals)
lon.max = max(eight$dim$lon$vals)
sst = setExtent(sst, ext = c(lon.min, lon.max, lat.min, lat.max))

# provide proper projection
crs(sst) = "+init=epsg:4326"

# convert raster to points
sst.p <- rasterToPoints(sst)
df <- data.frame(sst.p)
colnames(df) <- c("Longitude", "Latitude", "sst")
usa = map_data("usa")
ggplot(data=df, aes(y=Latitude, x=Longitude)) +
  geom_raster(aes(fill=sst)) +
  theme_bw() +
  coord_equal() +
  scale_fill_gradient("SST (Celsius)", limits=c(0,35)) +
  geom_polygon(data = usa, aes(x=long, y = lat, group = group)) + 

  theme(axis.title.x = element_text(size=16),
        axis.title.y = element_text(size=16, angle=90),
        axis.text.x = element_text(size=14),
        axis.text.y = element_text(size=14),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.position = "right",
        legend.key = element_blank()
  )

ggplot.png

通过栅格、maptools 数据、SP 变换和基础绘图

#read in the data
sst = raster("Downloads/sst.nc4",  varname = "sst", stopIfNotEqualSpaced=FALSE)

# get world map data
data("wrld_simpl", package="maptools")

## Crop to the desired extent, then plot
newext <- c(lon.min, lon.max, lat.min, lat.max)
out <- crop(wrld_simpl, newext)

#transform to proper CRS
out = spTransform(out, "+init=epsg:4326")

#plot
plot(out, col="khaki", bg="azure2")
plot(sst, add = T)

baseplot.png

-我用于此空间数据的投影是 EPSG:4326

-这是指定 sst.nc4 输出投影的 XML 片段

<crs>PROJCS["Mercator_1SP / World Geodetic System 1984",
         GEOGCS["World Geodetic System 1984",
         DATUM["World Geodetic System 1984",
         SPHEROID["WGS 84", 6378135.0, 298.257223563, AUTHORITY["EPSG","7030"]],
         AUTHORITY["EPSG","6326"]],
         PRIMEM["Greenwich", 0.0, AUTHORITY["EPSG","8901"]],
         UNIT["degree", 0.017453292519943295],
         AXIS["Geodetic longitude", EAST],
         AXIS["Geodetic latitude", NORTH]],
         PROJECTION["Mercator_1SP"],
         PARAMETER["latitude_of_origin", 0.0],
         PARAMETER["central_meridian", 0.0],
         PARAMETER["scale_factor", 1.0],
         PARAMETER["false_easting", 0.0],
         PARAMETER["false_northing", 0.0],
         UNIT["m", 1.0],
         AXIS["Easting", EAST],
         AXIS["Northing", NORTH]]</crs>

我还尝试将 map() 函数与 mapprojprojection 参数一起使用,但它似乎没有伪墨卡托投影作为一个选项。

最佳答案

这个有点令人困惑。通常最简单的方法是

sst = raster("sst.nc4",  varname = "sst")

但是,对于此文件,会出现以下错误:

"cells are not equally spaced; you should extract values as points"

所以让我们这样做:

library(ncdf4)
library(raster)
library(maptools)

d <- nc_open("sst.nc4")
sst <- ncvar_get(d, "sst")
lon <- ncvar_get(d, "lon")
lat <- ncvar_get(d, "lat")
nc_close(d)

xy <- cbind(rep(lon, length(lat)), rep(lat, each=length(lon)))

合并并删除 NA 值(大约一半的单元格...

xyv <- na.omit(cbind(xy, as.vector(sst)))

设置一个分辨率足以满足您的目的的 RasterLayer,并对点进行栅格化

 r <- raster(extent(range(lon), range(lat)), res=1/6)
 r <- rasterize(xyv[, 1:2], r, xyv[,3], fun=mean) 

情节

data(wrld_simpl)
w <- crop(wrld_simpl, r)

plot(r)
plot(w, col='gray', add=TRUE)

关于r - 如何在 R 中正确地将 map 添加到光栅图像,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/47296231/

相关文章:

r - 在 R 中通过多个 .csv 文件循环代码

css - R 删除数据表单元格的填充

javascript - NodeJS 通过纬度/经度查找国家/地区

java - sqlite,地理坐标索引?

c# - 投影具有多个键的 GroupBy 错误,缺少从 IGrouping`2 到 ModelName 的映射。使用 Mapper.CreateMap<IGrouping`2, ModelName> 创建

r - 遍历列表 R

sql-server - 在 SQL Server 中使用空间索引时出错

arrays - 给定一个记录数组,如何从每个记录中获取代表一个字段的数组?

ios - 从 OpenGL 中的窗口触摸获取相应的 3D 对象坐标/顶点

r - 如何在没有 NA 值的 data.frame 中选择行