从ggplot2图生成栅格

时间:2013-10-30 01:24:26

标签: r ggplot2

我正在使用一个情节,我需要以某种方式应用一个独特的回归。该图是一系列放在对数轴上的点。对于熟悉水文学的人来说,我试图用图形方式生成一个瞬态Theis解决方案,所以我的回归需要采用指数积分的形式(见Wikipedia page)。

这里需要注意的是,指数积分有自己的一组轴值,它们与初始曲线无关。这就是从数据中提取解决方案的方法,但在尝试在R中重现时会引入许多问题。

我想出了一些处理这个问题的想法(除了使用铅笔和纸张),但是每种方法都遇到了一些小障碍。对于任何这些解决方案的解决方法,我都很感激:

  1. 使用stat_smooth向绘图添加回归,根据其斜率在回归上任意选择一个点,然后将其与具有指数的适当轴的新绘图的相同斜率相关联积分。这里的问题是,我不确定如何将stat_smooth与除y ~ xy ~ poly(x, 2)y ~ log(x)的变体之外的公式一起使用。回归将要求poly和log函数的组合,但当我尝试这样做时R会打嗝。例如:

    stat_smooth(data = example, method = "lm",
        formula = y ~ log(x) + x - poly(x, 2)/4 + poly(x, 3)/18 - ...
    
  2. 我还尝试将数据和指数积分绘制为两个独立的图,然后根据我任意认为最合适的位置覆盖两个图(这可能是更简单的方法,并且对我的目的而言足够准确)。为了便于叠加,我删除了其背景,轴,网格线等的指数积分图,并且只留下带有标签的水平和垂直线,以指示曲线上具有特定值的点。如果我可以把它放在另一个图的顶部(假设,当然,两个图都保持相同的大小比例),我想我可以推动回归,直到它排列在我认为应该的位置,然后读出相应的基于水平和垂直标记线的存在的值。

    我已经阅读了一些关于annotation_raster的内容,并认为这可能是我将回归视为叠加图像的合适方式。不过,我的问题是首先将ggplot绘图转换为栅格。 as.raster()会产生以下错误:

    Error in as.raster(raster) : 
      error in evaluating the argument 'x' in selecting a method for function 'as.raster':
    Error in UseMethod("as.raster") : 
      no applicable method for 'as.raster' applied to an object of class "c('gg', 'ggplot')"
    

    如果我尝试使用raster包并使用raster()函数转换图,则会出现类似的错误。有一种简单的方法吗?

  3. 这是一些可重现的代码:

    library(ggplot2)
    
    Data = data.frame(matrix(
        # Elapsed_sec  Drawdown_ft
        c(20,  0.0038,
          40,  0.0094,
          60,  0.017,
          80,  0.0283,
          100, 0.0358,
          120, 0.0415,
          140, 0.049,
          160, 0.0528,
          180, 0.0548,
          200, 0.0567), nrow = 10, ncol = 2, byrow = TRUE))
    colnames(Data) = c("Elapsed_sec", "Drawdown_ft")
    
    Integral = data.frame(matrix(
        # u     W_u
        c(1e-3, 6.33,
          5e-3, 4.73,
          1e-2, 4.04,
          5e-2, 2.47,
          1e-1, 1.82,
          5e-1, 0.56,
          1e0,  0.219,
          2e0,  0.049,
          3e0,  0.013,
          4e0,  0.0038,
          5e0,  0.0011,
          6e0,  0.00036), nrow = 12, ncol = 2, byrow = TRUE))
    colnames(Integral) = c("u", "W_u")
    
    # Plot exponential integral (Theis curve)
    Tcurve = ggplot(Integral, aes(1/u, W_u)) + geom_line() +
        scale_x_log10(limits = c(10^-1, 10^3), breaks = c(10^-1, 10^0,  10^1,  10^2, 10^3)) +
        scale_y_log10(limits = c(10^-3, 10^1), breaks = c(10^-3, 10^-2, 10^-1, 10^0, 10^1)) +
        xlab("1/u") + ylab("W(u)") + coord_equal() +
        geom_hline(aes(yintercept = 0.219), linetype = 2) +
        geom_vline(aes(xintercept = 1),     linetype = 2) +
        geom_text(color = "black", size = 3, aes(x = 0.3, y = 0.3,  label = "W(u) = 0.219")) +
        geom_text(color = "black", size = 3, aes(x = 0.8, y = 0.01, label = "u = 1"), angle = 90) +
        theme(line = element_blank(), text = element_blank(), panel.background = element_rect(fill = NA))
    
    # Plot drawdown data
    plot = ggplot(Data, aes(Elapsed_sec, Drawdown_ft)) + geom_point(alpha = 0.5, size = 1) +
        scale_x_log10(limits = c(10^0,  10^4), breaks = c(10^0,  10^1,  10^2,  10^3, 10^4)) +
        scale_y_log10(limits = c(10^-3, 10^1), breaks = c(10^-3, 10^-2, 10^-1, 10^0, 10^1)) +
        xlab("Elapsed Time (sec)") + ylab("Drawdown (ft)") + coord_equal() + theme_bw()
    

    我上传图片,但目前我缺乏最低声誉。第一个图显示了指数积分,而第二个图显示了我试图拟合积分的数据。

1 个答案:

答案 0 :(得分:1)

这个问题发布已经五年了,但是我想我会分享我的想法。您可以将ggplot转换为raster对象,如下所示:

  1. 使用ggplottiff图保存到任何格式的图像文件中(我会使用ggsave
  2. 使用raster(或raster用于彩色图像)为保存的图像创建stack对象

上述实现如下:

# You may need to remove the margins from the plot (i.e., keep the earth raster and the routes only)
plot <- plot+ 
  theme(    
        axis.ticks=element_blank(), 
        axis.text.x=element_blank(), 
        axis.text.y=element_blank(), 
        axis.title.x=element_blank(), 
        axis.title.y=element_blank(),
        plot.margin = unit(c(0, 0, 0, 0), "null"),
        legend.position = 'none'
       ) +
       labs(x=NULL, y=NULL)

# Save the plot
ggsave(plot=plot, "my_ggplot.tiff", device = "tiff")

# Create a StackedRaster object from the saved plot
raster <- raster("my_ggplot.tiff") # OR stack("my_ggplot.tiff") for colored images

# Get the GeoSpatial Components
lat_long <- ggplot_build(plot)$layout$panel_params[[1]][c("x.range","y.range")] 

# Supply GeoSpatial  data to the StackedRaster 
extent(raster) <- c(lat_long$x.range,lat_long$y.range)
projection(raster) <- CRS("+proj=longlat +datum=WGS84")


# Then, do whatever you want with the raster object here

希望有帮助。