Combined geom_bar and geom_point legend in ggplotly

点点圈 提交于 2021-01-28 09:21:46

问题


I am trying to get a combined bar + point chart with a legend for both bars different Indicators) and points (a change in the Indicator). I tried to follow along with ggplot2 legend for plot combining geom_bar and geom_point and introduced a shape into my geom_point (without doing that I could not get a legend for points).

library(ggplot2)
library(dplyr)
library(ggthemes)
library(plotly)

set.seed(369)

obs <- 6

values1 <- c(round(100 + rnorm(obs) * 10, 2))
values2 <- c(round(100 + rnorm(obs) * 10, 2))

df <- data.frame(Year = rep(2014:2019, 2*2), 
                 value = c(rep(values1, 2), rep(values2, 2)),
                 Indicator = rep(c("Indicator1", "Indicator2"), each = obs * 2),
                 Type = rep(c("Bar", "Point"), each = obs))

p <- ggplot(df, aes(value))

bars <- df  %>%
  filter(Type == "Bar")

points <- df  %>%
  filter(Type == "Point")

pl <- p +
  geom_bar(data = bars,
           aes(fill = Indicator, group = Indicator, x = Year, y = value), stat = "identity", position = "dodge") +
  geom_point(data = points,  aes(x = Year, y = value, group = Indicator, fill = Indicator, shape = "Change"), position = position_dodge(width = 0.9)) +
  theme_tufte() 

p
ggplotly(pl, tooltip = c("value"))

ggplotly has the output I want, however the legend has a strange grouping. Is there a way to fix the legend in the chart below?


回答1:


there's probably a better way, but how's this:

library(tidyverse)

obs <- 6
values1 <- c(round(100 + rnorm(obs) * 10, 2))
values2 <- c(round(100 + rnorm(obs) * 10, 2))

df <- data.frame(Year = rep(2014:2019, 2*2), 
             value = c(rep(values1, 2), rep(values2, 2)),
             Indicator = rep(c("Indicator1", "Indicator2"), each = obs * 2),
             Type = rep(c("Bar", "Point"), each = obs))

bars   <- df  %>% filter(Type == "Bar")
points <- df  %>% filter(Type == "Point") %>% mutate(Year = 
                  ifelse(Indicator == "Indicator1", Year - 0.25, Year + 0.25))

 p <- ggplot(bars, aes(fill = Indicator, group = Indicator, x = Year, y = value)) +
      geom_bar(stat = "identity", position = "dodge", width = 1) 
 p <- p + geom_point(data = points, mapping = aes(fill = Indicator, x = 
      Year, y = value), shape = 21) + labs(x = "value") + labs(y = "value")
 p




回答2:


I don't know ggplotly() , but building separate geom_bar() and geom_point() plots, and then using get_legend() to remove each legend, and then building them back with plot_grid with the full plot seems a decent option.

library(tidyverse)

obs <- 6
values1 <- c(round(100 + rnorm(obs) * 10, 2))
values2 <- c(round(100 + rnorm(obs) * 10, 2))

df <- data.frame(Year = rep(2014:2019, 2*2), 
             value = c(rep(values1, 2), rep(values2, 2)),
             Indicator = rep(c("Indicator1", "Indicator2"), each = obs * 2),
             Type = rep(c("Bar", "Point"), each = obs))

bars   <- df  %>% filter(Type == "Bar")
points <- df  %>% filter(Type == "Point") %>% mutate(Year = 
ifelse(Indicator == "Indicator1", Year - 0.25, Year + 0.25),
                                                 IndicatorChange = Indicator)

p1 <- ggplot(points, mapping = aes(fill = IndicatorChange, x = Year, y = value )) + labs(x = "value") + labs(y = "value") +
      geom_point(shape = 21)
p1_leg <- get_legend(p1)
p2 <- ggplot(bars, aes(fill = Indicator, group = Indicator, x = Year, y = value)) +
      geom_bar(stat = "identity", position = "dodge") 
p2_leg <- get_legend(p2)

p_leg <- plot_grid(p1_leg, p2_leg, ncol = 1, nrow = 5) #toggle nrow to get right spacing between legends

p3 <-ggplot(bars, aes(fill = Indicator, group = Indicator, x = Year, y = value)) + geom_bar(stat = "identity", position = "dodge", width = 1) 
p3 <- p3 + geom_point(data = points, mapping = aes(fill = Indicator, x = Year, y = value), shape = 21) +
 labs(x = "value") + labs(y = "value")
p3 <- p3  + theme(legend.position="none")
p3
p <- plot_grid(p3, p_leg, ncol =2, nrow =2) #more toggling possible

p




回答3:


I don't know whether this is what you want(although the font size of the legend should be modified):

library(ggplot2)
library(dplyr)
library(ggthemes)
library(plotly)

set.seed(369)

obs <- 6

values1 <- c(round(100 + rnorm(obs) * 10, 2))
values2 <- c(round(100 + rnorm(obs) * 10, 2))

df <- data.frame(Year = rep(2014:2019, 2*2), 
                 value = c(rep(values1, 2), rep(values2, 2)),
                 Indicator = rep(c("Indicator1", "Indicator2"), each = obs * 2),
                 Type = rep(c("Bar", "Point"), each = obs))

p <- ggplot(df, aes(value))

bars <- df  %>%
  filter(Type == "Bar")

points <- df  %>%
  filter(Type == "Point")

points$Type1=paste(points$Indicator,"change",sep=",")


pl <- p +
  geom_bar(data = bars,
           aes(fill = Indicator, group = Indicator, x = Year, y = value), stat = "identity", position = "dodge") +
  geom_point(data = points,  
             aes(x = Year, y = value, group = Indicator, fill = Indicator, shape = "Change"), 
             position = position_dodge(width = 0.9)) +
  theme_tufte()+
  theme(legend.position="bottom")

pl <- p +
  geom_bar(data = bars,
           aes(fill = Indicator, group = Indicator,x = Year, y = value), stat = "identity", position = "dodge") +
  geom_point(data = points,  
             aes(x = Year, y = value,shape = Type1), 
             position = position_dodge(width = 0.9)) +
  theme_tufte()+
  theme(legend.position="bottom",
        legend.title=element_blank())
p


来源:https://stackoverflow.com/questions/49644446/combined-geom-bar-and-geom-point-legend-in-ggplotly

标签
易学教程内所有资源均来自网络或用户发布的内容,如有违反法律规定的内容欢迎反馈
该文章没有解决你所遇到的问题?点击提问,说说你的问题,让更多的人一起探讨吧!