我正试图获得数据框架的一个方面网格。
目的是总结每个人(n = 24)的每个进化枝(A,B,C,D,E,F)的成分(百分比)。
此外,每个分支的总和不是100%,但最终真的很接近它。 没有人获得Clade B或F.
这是我的R脚本:
library(scales)
library(reshape)
library(ggplot2)
#Add an id variable for the filled regions
X_clade$ind <- factor(X_clade$ind)
X_clade$days <- factor(X_clade$days)
X_clade$temperature <- factor(X_clade$temperature)
X_clade$D <- NULL
Clade <- c(X_clade$A, X_clade$B, X_clade$C, X_clade$E, X_clade$F)
Abundance= 100*cumsum(Clade)/sum(Clade)
str(X_clade)
Abundance
hist(Clade$A)
#subset
file.29<-X_clade[(X_clade$days == 29),]
file.65<-X_clade[(X_clade$days == 65),]
file.53<-X_clade[(X_clade$days == 53),]
#install.packages("wesanderson")
library(wesanderson)
plot_bar(X_clade)
file.29$B <- NULL
file.29$F <- NULL
seq(0.1,1,by=0.1)
p1<-ggplot(file.29,aes(x = ind, y=Abundance,fill = Clade)) +
geom_bar(position = "fill",stat = "identity") +
scale_y_continuous(labels = percent_format()) +
theme(panel.background = element_blank(),
panel.border=element_rect(fill=NA),
panel.grid.minor = element_blank(),
axis.text.x=element_text(colour="black",size=11),
axis.text.y=element_text(colour="black",size=11),
axis.title =element_blank()) + guides(fill=FALSE) +
facet_grid(days~temperature,scales="free_x")
p1
p_1M=ggplot(file.29,aes(x = ind, y=Abundance,fill = Clade))
p_1M
p2<-ggplot(file.53,aes(x = ind, y=Abundance,fill = Clade)) +
geom_bar(position = "fill",stat = "identity") +
scale_y_continuous(labels = percent_format()) +
theme(panel.background = element_blank(),
panel.border=element_rect(fill=NA),
panel.grid.minor = element_blank(),
strip.text.x = element_blank(),
axis.text.x=element_text(colour="black",size=11),
axis.text.y=element_text(colour="black",size=11),
axis.title =element_blank()) +guides(fill=FALSE) +
facet_grid(days~temperature,scales="free_x")
p2
p3<-ggplot(file.65,aes(x = ind, y=Abundance,fill = Clade)) +
geom_bar(position = "fill",stat = "identity") +
scale_y_continuous(labels = percent_format()) +
theme(panel.background = element_blank(),
panel.border=element_rect(fill=NA),
panel.grid.minor = element_blank(),
strip.text.x = element_blank(),
axis.text.x=element_text(colour="black",size=11),
axis.text.y=element_text(colour="black",size=11),
axis.title =element_blank()) + guides(fill=FALSE) +
facet_grid(days~temperature,scales="free_x")
p3
library(gridExtra)
grid.arrange(p1, p2, p3, nrow=3)
但是对于每个图(p1,p2,p3),我得到相同的错误信息:错误:美学必须是长度1或与数据(8)相同:x,y,fill。
如何解决这个问题的每一个见解都很可爱!我相信我离它不远了。 但是,仍然一直困扰着你!
我最好的
Homère
答案 0 :(得分:1)
一种解决方案可能是使用facet_wrap
关闭条带标签来绘制数据,并使用inkscape或photoshop添加所需的标签。
library(tidyverse)
d %>%
gather(k, v, -days, -ind, -temperature) %>%
ggplot(aes(x = factor(ind), y=v, fill = k)) +
geom_col() +
scale_y_continuous(labels = function(x) paste0(x, "%")) +
facet_wrap(~temperature + days, scales="free_x", dir = "v", ncol=2) +
theme(strip.text = element_blank(),
legend.position = "bottom")
或试试这个
p1 <- d %>%
gather(k, v, -days, -ind, -temperature) %>%
filter(days == 29) %>%
ggplot(aes(x = factor(ind), y=v, fill = k)) +
geom_col() +
scale_y_continuous(labels = function(x) paste0(x, "%")) +
facet_grid(days~temperature, scales="free_x")+
xlab("") +
theme(legend.position = "none")
p2 <- d %>%
gather(k, v, -days, -ind, -temperature) %>%
filter(days == 53) %>%
ggplot(aes(x = factor(ind), y=v, fill = k)) +
geom_col() +
scale_y_continuous(labels = function(x) paste0(x, "%")) +
facet_grid(days~temperature, scales="free_x")+
xlab("") +
theme(strip.text.x = element_blank(),
legend.position = "none")
p3 <- d %>%
gather(k, v, -days, -ind, -temperature) %>%
filter(days == 65) %>%
ggplot(aes(x = factor(ind), y=v, fill = k)) +
geom_col() +
scale_y_continuous(labels = function(x) paste0(x, "%")) +
facet_grid(days~temperature, scales="free_x")+
theme(strip.text.x = element_blank(),
legend.position = "none")
p4 <- d %>%
gather(k, v, -days, -ind, -temperature) %>%
ggplot(aes(x = factor(ind), y=v, fill = k)) +
geom_col() +
theme_void()
library(cowplot)
cowplot::plot_grid(plot_grid(p1, p2, p3, ncol = 1), get_legend(p4), rel_widths = c(0.9,0.1))
答案 1 :(得分:0)
这是一个将purrr
与cowplot
结合起来制作图表并将它们排列在一起的版本。我通过在facet_grid
上拆分数据来模仿temperature
,使用facet_wrap
制作单独的图表列。使用imap
,我得到每个拆分数据框的名称 - 温度 - 并将其用于标题。然后我做了一些稍微讨厌的事情来提取图例,从两个图中删除图例,使左边图上的条纹文本不可见,并将它们全部绘制在一起。
library(tidyverse)
df2 <- df %>%
mutate_at(vars(days, temperature, ind), as.factor) %>%
gather(key = group, value = value, -ind, -days, -temperature) %>%
mutate(value = value / 100)
plots <- df2 %>%
split(.$temperature) %>%
imap(function(dat, temp) {
ggplot(dat, aes(x = ind, y = value, fill = group)) +
geom_col() +
scale_y_continuous(labels = scales::percent) +
scale_fill_discrete(drop = T) +
labs(x = NULL, y = NULL) +
facet_wrap(~ days, ncol = 1, scales = "free_x", strip.position = "right") +
theme_minimal() +
theme(strip.text.y = element_text(angle = 0, face = "italic"),
plot.title = element_text(hjust = 0.5, face = "italic")) +
ggtitle(paste0(temp, "°C"))
})
例如,第一列图表如下所示:
plots[[1]]
我将第一列上的条带文本设置为白色以匹配条带背景,因为我希望它仍然占用一些空间(因此列仍然具有相同的宽度)但不可见。
legend <- cowplot::get_legend(plots[[1]])
no_legends <- plots %>% map(~. + theme(legend.position = "none"))
no_legends[[1]] <- no_legends[[1]] + theme(strip.text = element_text(color = "white"))
使用cowplot
并跟随one of its vignettes,我在没有图例的情况下制作了两个图的一个网格,并在第一个网格和图例中创建了第二个网格,并调整相对宽度以适应。你可以从这里做很多间距和调整。
two_plots <- cowplot::plot_grid(plotlist = no_legends)
cowplot::plot_grid(two_plots, legend, rel_widths = c(2, 0.25))
由reprex package(v0.2.0)创建于2018-05-25。