根据ggplot中的两个列表创建qqPlot

时间:2020-09-18 18:41:25

标签: r ggplot2 statistics quantile

我有两个带有四个数据帧的列表。第一个列表(“ loc_list_OBS”)中的数据帧只有两列“ Year”和“ Mean_Precip”,而第二个列表(“ loc_list_Model”)中的数据帧具有33列“ Year”,然后分别表示32种不同的降水量模型。

因此loc_list_OBS中的数据帧看起来像这样,但是数据一直到2005年:

Year     Mean_Precip
1965    799.1309
1966    748.0239
1967    619.7572
1968    799.9263
1969    680.9194
1970    766.2304
1971    599.5365
1972    717.8912
1973    739.4901
1974    707.1130
...     ....
2005    ....

loc_list_Model中的数据帧看起来像这样,但总共有32个Model列,数据也流向2005年:

Year   Model 1      Model 2      Model 3    ...... Model 32
1965    714.1101    686.5888    1048.4274
1966    1018.0095    766.9161     514.2700
1967    756.7066    902.2542     906.2877
1968    906.9675    919.5234     647.6630
1969    767.4008    861.1275     700.2612
1970    876.1538    738.8370     664.3342
1971    781.5092    801.2387     743.8965
1972    876.3522    819.4323     675.3022
1973    626.9468    927.0774     696.1884
1974    752.4084    824.7682     835.1566
....    .....       .....         .....
2005    .....       .....         .....

每个数据框代表一个地理位置,两个列表具有相同的四个位置,但是一个列表用于观测值,另一个列表用于同一时间范围内的建模值。

我想创建qqplots,将观察值的分位数与每个位置的每个模型的分位数进行比较。我也希望每个位置的pdf都包含一个qqplots。我已经编写了将建模数据与标准正态分布进行比较的代码,并创建了四个以上指定的pdf。该代码如下:

for (q in loc_list) local({
  qq_combine_plot <- gather(q, condition, measurement, 2:33, 
                            factor_key = TRUE)
  ggplot(qq_combine_plot, aes(sample = measurement)) +
    facet_wrap(~ condition, scales = "free") +
    stat_qq() +
    stat_qq_line()+
    ggtitle(paste("qqplot for Mean Yearly Precip \n NE 2020-59 RCP45", 
                  names(q)))+
    theme(plot.title = element_text(hjust = 0.5))+
    labs(y = "Mean Yearly Precip (mm)")
  ggsave(file=paste("qq_NE_59_s45_", names(q), ".pdf"), 
         device = pdf, height = 14, width = 14)
})

我能够创建qqplots来比较上述两个列表中的分位数,但是我无法弄清楚如何使用ggplot做到这一点,并且在合并图并具有适当模型标题的情况下仍具有相同的pdf输出。我为此使用的代码是:

myfun <- function(x,y)
{
  OBS_Data <- x$Mean_Precip
  for(i in 2:dim(y)[2])
{
    Model_Data <- y[,i]
    qqplot(x=OBS_Data, y=Model_Data, 
           ylab = "Model Quantile Values",
           xlab = "Observed Quantile Values")
  }
}

t.stat <- mapply(FUN = myfun,x=loc_list_OBS,y=loc_list_Model,SIMPLIFY = FALSE)

有人能帮助我解决这个问题吗?

1 个答案:

答案 0 :(得分:1)

如果我正确理解,您想将第一个列表中的数据与第二个列表中的数据进行比较。然后为所有模型构建一个类似于ggplot2的{​​{1}}图。然后在每个城市的图之间进行区别并保存图(如果您有4个位置,则应在pdf中包含4张幻灯片)。在这种情况下,我建议使用循环的下一种方法。您包括的步骤很有用。为了比较两个数据帧,您必须在qqplot()操作之后将它们加入。可以计算gather()值,并将其包含在代码中。此解决方案使用qqplot()函数完成,因此请检查是否已安装ID。最终输出将为pdf,但我创建了一个列表(tidyverse),在打印之前已存储了图。这里的代码基于您共享的内容使用了虚拟列表(由Listdf1创建,这些列表位于本文的末尾)。

df2

现在进行设置以达到所需的输出:

library(tidyverse)
#Code for data
#Data 1
List1 <- list(u1=df1,u2=df1,u3=df1,u4=df1)
#Data 2
List2 <- list(u1=df2,u2=df2,u3=df2,u4=df2)

循环从两个列表中获取数据并复制步骤,以便绘制出图并将其保存在#Create an empty list to save the plots List <- list() #Loop any of List1 and List2 has the same length for(i in 1:length(List1)) { x <- List1[[i]] y <- List2[[i]] #Text chain for names textchain <- names(List1[i]) #First reshape data qq_combine_plot <- gather(y, condition, measurement, 2:dim(y)[2], factor_key = TRUE) #Now merge with original measure aka mean qqmer <- qq_combine_plot %>% left_join(x) #Now compute the qqplot measures r1 <- qqmer %>% group_by(condition) %>% nest() %>% mutate(qq = map(.x = data, ~as.data.frame(qqplot(x = .$Mean_Precip, y = .$measurement, plot.it = FALSE)))) %>% unnest(qq) #Prepare plot G <- r1 %>% ggplot(aes(x = x, y = y)) + geom_point() + facet_wrap(~condition,scales = 'free')+ theme_bw()+theme(panel.grid = element_blank())+ ylab("Model Quantile Values")+xlab("Observed Quantile Values")+ ggtitle(paste0("qqplot for Mean Yearly Precip and modelled values between ",textchain," data")) #Assign to list List[[i]] <- G } 中。

最后,我们使用另一个循环将图打印为pdf。它们各自的标题根据列表名称显示位置。在这种情况下,我将虚拟名称设置为List

u1,...,u4

最终输出将是您定义的某个目录中的pdf。请注意#Export to pdf pdf('Example.pdf',width = 14) for(i in c(1:length(List))) { plot(List[[i]]) } dev.off() 。您可以使用提到的函数具有的参数facet_wrap()nrow来调整图中的列和行数。这是生成的pdf的一些输出:

enter image description here

使用了一些数据:

ncol