繁体   English   中英

使用ggplot和管道将线型拟合到多因素图解的图例中

[英]Fit linetype in the legend of a multifactorial plot, using ggplot and pipes

以下代码使用颜色和线型的组合来绘制许多不同的条件。 它使用一条线绘制“ R”,并使用虚线绘制“ W”。

我想图例分成两个部分: 条件 “HC”和“IC”,并型号类型 “R”和“W”。 Condition中 ,我们要表示线条的颜色。 Model type中 ,我们要表示线的类型(例如,黑色的虚线和非虚线)。

由于我使用管道,因此到目前为止,我还没有找到解决方案。

library(ggplot2)
library(scales)
tribble(    ~y,    ~cb,   ~z,    ~x,
            1     , 0,   "H C R"    ,1,
            2     , 1,   "H C R"    ,1,
            2     , 0,   "I C R"    ,1,
            3     , 1,   "I C R"    ,1,
            1.5   , 0,   "H C W"    ,1,
            2     , 1,   "H C W"    ,1,
            2     , 0,   "I C W"    ,1,
            2     , 1,   "I C W"    ,1,
            3     , 0,   "H C R"    ,2,
            3     , 1,   "H C R"    ,2,
            0.5   , 0,   "I C R"    ,2,
            2     , 1,   "I C R"    ,2,
            2     , 0,   "H C W"    ,2,
            2     , 1,   "H C W"    ,2,
            1     , 0,   "I C W"    ,2,
            1     , 1,   "I C W"    ,2)-> datos


aux<-datos %>%
  group_by(x, z, cb) %>%
  summarise(media = mean(y), 
            desvio = rnorm(1),
            error_est = desvio / sqrt(n()),             
            intervalo_sup = media + (2*error_est),       
            intervalo_inf = media - (2*error_est)) #%>%


library(RColorBrewer)
display.brewer.pal(11,name = "Spectral")  
brewer.pal(n = 11, name = "Spectral")
# Que la línea de condición "H C" apareciera en el color anaranjado que utiliza la paleta "Spectral".
# Que la línea de condición "I C" apareciera en el color verde oscuro que utiliza la paleta "Spectral".
colores<-brewer.pal(n = 11, name = "Spectral")[c(3,3,9,9)]




  ggplot() +

  geom_line(data=aux%>%filter(grepl("W",z)),
            aes(x = x, y = media, color = z,group = z),
            size=0.5,
            linetype = "dashed") +                      
  geom_errorbar(data=aux%>%filter(grepl("W",z)),aes(x = x, color = z,
                              ymax = intervalo_sup,               
                    ymin = intervalo_inf),
                width=0.3) + 

    geom_line(data=aux%>%filter(!grepl("W",z)),
              aes(x = x, y = media, color = z,group = z),
              size=0.5) +                      
    geom_errorbar(data=aux%>%filter(!grepl("W",z)),
                  aes(x = x, color = z,
                                ymax = intervalo_sup,               
                                ymin = intervalo_inf),
                  width=0.3)+
  labs(x = "x", y = "y", color = "Condition") +

  scale_color_manual(values=colores) +
  scale_x_continuous(breaks = seq(1,7, by=1)) +
  theme(legend.position="bottom", legend.text=element_text(size=12)) +
  guides(color=guide_legend(ncol=2)) +
  theme(axis.text=element_text(size=14),
        axis.title=element_text(size=14))+
  facet_wrap(~cb)

在此处输入图片说明

解决方案使用stringr

library(dplyr)
library(ggplot2)
library(scales)
library(RColorBrewer)
library(stringr)

#Selection of desired colors
display.brewer.pal(11,name = "Spectral") 
colores<-brewer.pal(n = 11, name = "Spectral")[c(3,9)]

#Stats
datos %>%
  group_by(x, z, cb) %>%
  summarise(media = mean(y), 
            desvio = rnorm(1),                         
            error_est = desvio / sqrt(n()),             
            intervalo_sup = media + (2*error_est),       
            intervalo_inf = media - (2*error_est))%>%
  #Two columns for color and linetype (be careful when using stringr)
  mutate(Model=str_split(z," ")[[1]][3],
         Condition=str_remove(z,Model)
            )%>%
  #Plot
ggplot(aes(x = x, y = media, color = Condition,group = z)) +
  geom_line(aes(linetype=Model, color=Condition),size=0.5)+
  geom_errorbar(aes(x = x, color = Condition,
                    ymax = intervalo_sup,               
                    ymin = intervalo_inf),
                width=0.3)+
  scale_color_manual(values=colores) +
  scale_x_continuous(breaks = seq(1,7, by=1)) +
  theme(legend.position="bottom", legend.text=element_text(size=12)) +
  theme(axis.text=element_text(size=14),
        axis.title=element_text(size=14))+
  facet_wrap(~cb)+
  # Legends' title
  guides(color=guide_legend("Condition"),
         linetype=guide_legend("Model"))  

暂无
暂无

声明:本站的技术帖子网页,遵循CC BY-SA 4.0协议,如果您需要转载,请注明本站网址或者原文地址。任何问题请咨询:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM