For循环创建ggplots列表时,始终为点和线段保存相同的坐标

时间:2019-01-31 15:53:57

标签: r for-loop ggplot2

首先,您需要加载以下软件包:

library(ggplot2)
library(ggrepel)

我有一个像这样的数据框“ dframe”:

V1          V2           V3          V4          V5          V6          V7          Groups
0.05579838 -0.44781204 -0.164612982 -0.05362210 -0.23103516 -0.04923499 -0.06634579      1
0.14097924 -0.35582736  0.385218841  0.18004788 -0.18429327  0.29398646  0.69460669      2
0.10699838 -0.38486299 -0.107284020  0.16468591  0.48678593 -0.70776085  0.20721932      3
0.22720072 -0.30860464 -0.197930310 -0.24322096 -0.30969028 -0.04460600 -0.08420536      4
0.24872635 -0.23415141  0.410406163  0.07072146 -0.09302970  0.01662256 -0.21683816      5
0.24023670 -0.27807097 -0.096301697 -0.02373198  0.28474825  0.27397862 -0.29397324      6
0.30358363  0.05630646 -0.115190308 -0.51532428 -0.08516130 -0.08785924  0.12178198      7
0.28680386  0.07609196  0.488432908 -0.13082951  0.00439161 -0.17572986 -0.25854047      8
0.30084361  0.06323714 -0.008347161 -0.26762137  0.40739524  0.22959024  0.19107494      9
0.27955675  0.22533959 -0.095640072 -0.27988676 -0.04921808 -0.10662521  0.19934074     10
0.25209125  0.22723231  0.408770841  0.13013867 -0.03850484 -0.23924023 -0.16744745     11
0.29377963  0.13650247 -0.105720288 -0.00316556  0.29653723  0.25568169  0.06087608     12
0.24561895  0.28729625 -0.167402464  0.24251060 -0.22199262 -0.17182828  0.16363196     13
0.25150342  0.25298115 -0.147945172  0.43827820  0.02938933  0.01778563  0.15241257     14
0.30902922 -0.01299330 -0.261085058  0.13509982 -0.40967529 -0.11366113 -0.06020937     15
0.28696274 -0.12896680 -0.196764195  0.39259942  0.08362863  0.25464125 -0.29386260     16

这里是可复制的数据框,可以从Mark Peterson使用:

dframe <-
  rnorm(70) %>%
  matrix(nrow = 10) %>%
  as_tibble() %>%
  setNames(paste0("V", 1:ncol(.))) %>%
  mutate(Groups = 1:nrow(.)
         , Label = 1:nrow(.))

我创建了一个要在数据框中使用的列组合表:

#Create all possible combinations
combs<-expand.grid(seq(7),seq(7))
#Remove duplicate and order
combs<-combs[combs$Var1 != combs$Var2,]
combs<-combs[order(combs[,1]),]

然后我做了一个for循环应该产生ggplots的列表,1个情节由组合:

list_EVplots<-list()
  for(i in seq(nrow(combs))){
    list_EVplots[[paste(combs[i,1],"&",combs[i,2])]]<- ggplot(data=dframe) +
      ggtitle(paste("Eigenvector Plot - Pairwise",
                    "correlation with","adjustment")) +
      geom_point(aes(x = dframe[,combs[i,1]], y = dframe[,combs[i,2]],
                     color = Groups)) +
      geom_segment(aes(x = rep(0,nrow(dframe)), y = rep(0,nrow(dframe)),
                       xend = dframe[,combs[i,1]], yend = dframe[,combs[i,2]],
                       color = Groups),
                   size = 1, arrow = arrow(length = unit(0.3,"cm"))) +
      geom_label_repel(aes(x = dframe[,combs[i,1]], y = dframe[,combs[i,2]],
                           label = rownames(dframe))) +
      scale_color_manual(values=colors) +
      xlab(paste0("Eigenvector ",combs[i,1])) +
      ylab(paste0("Eigenvector ",combs[i,2])) +
      theme(plot.title = element_text(hjust = 0.5),
            axis.title = element_text(size = 13),
            legend.text = element_text(size=12)) +
      geom_hline(yintercept = 0, linetype="dashed") +
      geom_vline(xintercept = 0, linetype="dashed")
  }

运行此for循环后,我获得了列表“ list_EVplots”。 问题:迭代似乎适用于xlab()和ylab(),它也适用于列表中图的名称,但是geom_point(aes())和geom_segment(aes())的坐标不变。显然应该更改时,坐标保持不变! 我认为坐标保持锁定在用于第一次迭代的第一图的坐标上。 如果有人有解决方案,我将非常感谢您的帮助。

在Linux 16.04和R Studio下工作。 R版本3.5.2(2018-12-20)-“蛋壳冰屋”

我试图与只有我想与工作,而不是使用一个8列数据帧的列的子集数据帧:不工作

预期:该列表应包含不同的图:所有图应不同。

问题:列表中所有图和点的坐标都相同。

1 个答案:

答案 0 :(得分:1)

最简单的答案通常是最简单的答案:尝试避免在for更合适的地方使用lapply循环。在您的代码中,没有发现任何明显的问题可以暗示问题所在,但我猜测这是在深层嵌套的[]语句中存在的问题。

这里是一种使用lapplyaes_string处理变量的方法。如果您想要的不是完整的成对图集,则可能需要稍微修改一下两个lapply的调用。

首先,提供一些可重现的数据(使用dplyr制作)。请注意,我使Labels是显式的,而不是依赖行名(这是一种好习惯,并且在调用ggplot时更容易使用)。

dframe <-
  rnorm(70) %>%
  matrix(nrow = 10) %>%
  as_tibble() %>%
  setNames(paste0("V", 1:ncol(.))) %>%
  mutate(Groups = 1:nrow(.)
         , Label = 1:nrow(.))

然后,我要提取要用于绘图的列。我为它们命名,以便返回的列表具有自动分配的列名。

my_cols <-
  names(dframe)[1:7] %>%
  setNames(.,.)

然后,只需设置一个嵌套的lapply即可完成所有成对比较:

plot_list <-
  lapply(my_cols, function(col1){
    lapply(my_cols, function(col2){

      if(col1 == col2){
        return(NULL)
      }

      ggplot(dframe) +
        ggtitle(paste("Eigenvector Plot - Pairwise",
                      "correlation with","adjustment")) +
        geom_point(aes_string(x = col1
                              , y = col2
                              , color = "Groups")) +
        geom_segment(aes_string(xend = col1
                                , yend = col2
                                , color = "Groups")
                     , x = 0
                     , y = 0
                     , size = 1
                     , arrow = arrow(length = unit(0.3,"cm"))) +
        geom_label_repel(aes_string(x = col1
                                    , y = col2
                                    , label = "Label")) +
        xlab(paste0("Eigenvector ", col1)) +
        ylab(paste0("Eigenvector ", col2)) +
        theme(plot.title = element_text(hjust = 0.5),
              axis.title = element_text(size = 13),
              legend.text = element_text(size=12)) +
        geom_hline(yintercept = 0, linetype="dashed") +
        geom_vline(xintercept = 0, linetype="dashed")

    })
  })

请注意,您没有包括要用于组的颜色,因此我保留了默认设置。

图可以正确显示,应该更容易处理。