问题描述
我正在尝试使用facet_wrap和ggplot2将多个标题添加到绘图中.说您例如拥有两年内的季度数据,并希望以图形方式比较带有两个主要标题的季度数据; 2014年和2015年,以及相应季度的标题.
I am trying to add multiple titles to a plot using facet_wrap and ggplot2. Say that you e.g. have quarterly data over two years, and wants a graphical comparison of the quarterly data with two major titles; 2014 and 2015, as well as titles for the respective quarter.
我已经走了这么远:
data <- rnorm(10)
A1 <- data.frame("Y"=data, "X"=1:10, "Q"=1, "year"=2014)
A2 <- data.frame("Y"=data, "X"=1:10, "Q"=2, "year"=2014)
A3 <- data.frame("Y"=data, "X"=1:10, "Q"=3, "year"=2014)
A4 <- data.frame("Y"=data, "X"=1:10, "Q"=4, "year"=2014)
N1 <- data.frame("Y"=data, "X"=1:10, "Q"=1, "year"=2015)
N2 <- data.frame("Y"=data, "X"=1:10, "Q"=2, "year"=2015)
N3 <- data.frame("Y"=data, "X"=1:10, "Q"=3, "year"=2015)
N4 <- data.frame("Y"=data, "X"=1:10, "Q"=4, "year"=2015)
A <- rbind(A1, A2, A3, A4)
N <- rbind(N1, N2, N3, N4)
tmp <- data.frame(rbind(A, N))
ggplot(data=tmp, aes(x=X, y=Y)) + geom_line() + facet_wrap(~year + Q, scales="free", ncol=4)
这给了我这张图:
相反,我希望"2014"和"2015"位于每个子图上方的两个单独的灰色框中.有可能吗?
Instead I would like "2014" and "2015" to be in two separate grey boxes above each sub graph. Is that possible?
谢谢!
推荐答案
您击败了我RHA,在看到您的帖子之前,我编写了几乎与您相同的代码.无论如何,谢谢!
You beat me to it RHA, I wrote almost an identical code to yours before I saw your post. Anyhow, thanks!
我还想从灰色框中删除"2014"和"2015"(我在第一篇文章中未指定),因此我不得不进行一些修改.
I also wanted to remove "2014" and "2015" from the grey boxes (which I didn't specified in my first post), so I had to make some more modifications.
With some inspiration from here, here, and here, I came up with the following (really ugly) code:
data14 <- rnorm(10)
data15 <- rnorm(10, mean = 500)
A1 <- data.frame("Y"=data14, "X"=1:10, "Q"=1, "year"=2014)
A2 <- data.frame("Y"=data14, "X"=1:10, "Q"=2, "year"=2014)
A3 <- data.frame("Y"=data14, "X"=1:10, "Q"=3, "year"=2014)
A4 <- data.frame("Y"=data14, "X"=1:10, "Q"=4, "year"=2014)
N1 <- data.frame("Y"=data15, "X"=1:10, "Q"=1, "year"=2015)
N2 <- data.frame("Y"=data15, "X"=1:10, "Q"=2, "year"=2015)
N3 <- data.frame("Y"=data15, "X"=1:10, "Q"=3, "year"=2015)
N4 <- data.frame("Y"=data15, "X"=1:10, "Q"=4, "year"=2015)
A <- rbind(A1, A2, A3, A4)
N <- rbind(N1, N2, N3, N4)
tmp <- data.frame(rbind(A, N))
然后我做了一个简单的函数,正确地命名了变量
Then I made a simple function naming the variables correctly
labFunc <- function(data, var1, var2, names) {
data$id <- NA
loop <- length(levels(factor(data[[var2]])))
for (i in 1:loop) {
data[data[[var1]] == 2014 & data[[var2]] == levels(factor(data[[var2]]))[i], "id"] <- names[i]
data[data[[var1]] == 2015 & data[[var2]] == levels(factor(data[[var2]]))[i], "id"] <- paste(names[i], "")
}
first <- levels(factor(data$id))[seq(from=1, to = length(levels(factor(data$id))), by = 2)]
second <- levels(factor(data$id))[seq(from=2, to = length(levels(factor(data$id))), by = 2)]
data$id <- factor(data$id, levels=paste(c(first, second)))
return(data)
}
names <- c("Q1", "Q2", "Q3", "Q4")
data <- labFunc(tmp, "year", "Q", names)
绘制情节:
p <-ggplot(data, aes(y = Y, x = X)) +
geom_line() +
facet_wrap( ~ id , ncol = 4, scales = "free")
然后最后添加主要标签
z <- ggplotGrob(p)
# New strip at the top
z <- gtable_add_rows(z, unit(1, "lines"), pos = 0) # New row added to top
z <- gtable_add_rows(z, unit(1, "lines"), pos = 6) # New row added to top
#z <- gtable_add_rows(z, unit(9, "lines"), pos = 0) # New row added to top
# Check the layout
gtable_show_layout(z) # New strip goes into row 2
# New strip spans columns 4 to 8
z <- gtable_add_grob(z,
list(rectGrob(gp = gpar(col = NA, fill = grey(0.8), size = .5)),
textGrob("2014", vjust = .27,
gp = gpar(cex = .75, fontface = 'bold', col = "black"))), 2, 4, 2, 14, name = c("a", "b"))
z <- gtable_add_grob(z,
list(rectGrob(gp = gpar(col = NA, fill = grey(0.8), size = .5)),
textGrob("2015", vjust = .27,
gp = gpar(cex = .75, fontface = 'bold', col = "black"))), 7, 4, 7, 14, name = c("a", "b"))
# Add small gap between strips - below row 2
z <- gtable_add_rows(z, unit(2/10, "lines"), 2)
z <- gtable_add_rows(z, unit(5/10, "lines"), 7)
# Draw it
grid.newpage()
grid.draw(z)
这比我想的要棘手,但是谢谢大家的帮助!
This was a bit more trickier than I thought, but thank you all for the help!
这篇关于facet_wrap(ggplot2)中的多个标题的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持!