如何使用for循环在ggplot中添加图层

时间:2013-04-13 11:37:35

标签: r ggplot2

我想将数据框的每一列绘制到ggplot2中的单独图层。 逐层构建绘图效果很好:

df<-data.frame(x1=c(1:5),y1=c(2.0,5.4,7.1,4.6,5.0),y2=c(0.4,9.4,2.9,5.4,1.1),y3=c(2.4,6.6,8.1,5.6,6.3))

ggplot(data=df,aes(df[,1]))+geom_line(aes(y=df[,2]))+geom_line(aes(y=df[,3]))

有没有办法使用单个函数绘制所有列的可用列?

我尝试这样做,但它不起作用:

    plotAllLayers<-function(df){
    p<-ggplot(data=df,aes(df[,1]))
    for(i in seq(2:ncol(df))){ 
        p<-p+geom_line(aes(y=df[,i]))
        }
        return(p)
    }

plotAllLayers(df)

4 个答案:

答案 0 :(得分:15)

一种方法是使用库melt()中的函数reshape2将数据框从宽格式重新整理为长格式。在新数据框架中,您将获得x1个值,variable用于确定来自哪个列数据,value包含所有原始y值。

现在,您可以使用ggplot()geom_line()调用来绘制所有数据,并使用variable为每行提供单独的颜色。

 library(reshape2)
 df.long<-melt(df,id.vars="x1")
 head(df.long)
  x1 variable value
1  1       y1   2.0
2  2       y1   5.4
3  3       y1   7.1
4  4       y1   4.6
5  5       y1   5.0
6  1       y2   0.4
 ggplot(df.long,aes(x1,value,color=variable))+geom_line()

enter image description here

如果你真的想使用for()循环(不是最好的方法),那么你应该使用names(df)[-1]而不是seq()。这将生成列名称的向量(第一列除外)。然后在geom_line()内使用aes_string(y=i)按名称选择列。

plotAllLayers<-function(df){
  p<-ggplot(data=df,aes(df[,1]))
  for(i in names(df)[-1]){ 
    p<-p+geom_line(aes_string(y=i))
  }
  return(p)
}

plotAllLayers(df)

enter image description here

答案 1 :(得分:6)

我在大型凌乱的数据集上尝试了熔化方法,并希望获得更快,更清洁的方法。此for循环使用eval()来构建所需的绘图。

fields <- names(df_normal) # index, var1, var2, var3, ...

p <- ggplot( aes(x=index), data = df_normal)
for (i in 2:length(fields)) { 
  loop_input = paste("geom_smooth(aes(y=",fields[i],",color='",fields[i],"'))", sep="")
  p <- p + eval(parse(text=loop_input))  
}
p <- p + guides( color = guide_legend(title = "",) )
p

当我测试时,这比一个大的熔化数据集运行得快得多。

我也尝试使用aes_string(y = fields [i],color = fields [i])方法进行for循环,但是无法区分颜色。

答案 2 :(得分:0)

对于OP的情况,我认为pivot_longer是最好的。但是今天,我遇到了似乎无法适应的情况,因此我使用以下代码以编程方式创建了图层。我不需要使用eval()

data_tibble <- tibble(my_var = c(650, 1040, 1060, 1150, 1180, 1220, 1280, 1430, 1440, 1440, 1470, 1470, 1480, 1490, 1520, 1550, 1560, 1560, 1600, 1600, 1610, 1630, 1660, 1740, 1780, 1800, 1810, 1820, 1830, 1870, 1910, 1910, 1930, 1940, 1940, 1940, 1980, 1990, 2000, 2060, 2080, 2080, 2090, 2100, 2120, 2140, 2160, 2240, 2260, 2320, 2430, 2440, 2540, 2550, 2560, 2570, 2610, 2660, 2680, 2700, 2700, 2720, 2730, 2790, 2820, 2880, 2910, 2970, 2970, 3030, 3050, 3060, 3080, 3120, 3160, 3200, 3280, 3290, 3310, 3320, 3340, 3350, 3400, 3430, 3540, 3550, 3580, 3580, 3620, 3640, 3650, 3710, 3820, 3820, 3870, 3980, 4060, 4070, 4160, 4170, 4170, 4220, 4300, 4320, 4350, 4390, 4430, 4450, 4500, 4650, 4650, 5080, 5160, 5160, 5460, 5490, 5670, 5680, 5760, 5960, 5980, 6060, 6120, 6190, 6480, 6760, 7750, 8390, 9560))

# This is a normal histogram
plot <- data_tibble %>%
  ggplot() +
  geom_histogram(aes(x=my_var, y = ..density..))

# We prepare layers to add
stat_layers <- tibble(distribution = c("lognormal", "gamma", "normal"),
                     fun = c(dlnorm, dgamma, dnorm),
                     colour = c("red", "green", "yellow")) %>% 
  mutate(args = map(distribution, MASS::fitdistr, x=data_tibble$my_var)) %>% 
  mutate(args = map(args, ~as.list(.$estimate))) %>% 
  select(-distribution) %>% 
  pmap(stat_function)

# Final Plot
plot + stat_list

这个想法是您使用要插入到geom / stat函数中的参数来组织小标题。每行应对应一个您要添加到ggplot中的+层。然后使用pmap。这样会创建一个图层列表,您可以将其简单地添加到绘图中。

答案 3 :(得分:0)

重塑您的数据以便您不需要循环是最好的选择。否则,对于较新版本的 ggplot,您可以在 .data 中使用 aes() 代词。你可以这样做

plotAllLayers<-function(df){
    p <- ggplot(data=df, aes(df[,1]))
    for(i in names(df)[2:ncol(df)]){ 
        p <- p + geom_line(aes(y=.data[[i]]))
    }
    return(p)
}
plotAllLayers(df)

我们使用 .data 代词获取传递给 ggplot 对象的数据,并遍历列名,因为 .data 出于某种原因不喜欢索引。< /p>