r - 按组手动填充多个比例的geom_tile

标签 r ggplot2

我有以下当前输出:

我的目标是像这样的着色,但只填充到最大级别(例如填充停止在当前级别):

创建此数据的数据是:

df <- tribble(~Question_Code,   ~RespondentLevel,
"Engagement - Inclusion",   5,
"External engagement - policies",   2,
"External engagement - technology", 5,
"Community data ",  5,
"Internal engagement",  5,
"Internal use of technology",   4,
"Familiarity/Alignment",    5,
"Environmental impacts",    5,
"Innovation",   2,
"Use of open-source technology",    2,
"Regulation of hardware & software",    5,
"In-house technical capacity",  5,
"Infrastructure procurement",   5,
"Algorithmic Error & Bias", 2,
"Control: Privacy", 5,
"Accountability in Governance Structures",  3,
"Open procurement", 5,
"Use in decision-making",   1,
"Accountability",   1,
"External Control", 4,
"Internal Control", 2,
"Open Data",    2)
levels <-  c("Open Data","Internal Control","External Control","Accountability",
             "Use in decision-making","Open procurement","Accountability in Governance Structures","Control: Privacy",
             "Algorithmic Error & Bias","Infrastructure procurement","In-house technical capacity",
             "Regulation of hardware & software","Use of open-source technology","Innovation",
             "Environmental impacts","Familiarity/Alignment",
             "Internal use of technology","Internal engagement","Community data",
             "External engagement - technology","External engagement - policies","Engagement - Inclusion")

df <- df %>% mutate(Domain = c(as.character((rep("Domain 1", 5))),
                  as.character(rep("Domain 2", 4)),
                  as.character(rep("Domain 3", 6)),
                  as.character(rep("Domain 4", 7))))

对于 ggplot:

df %>% 
ggplot(aes(x = RespondentLevel, y = fct_rev(Question_Code))) +
  geom_tile() +
  theme_minimal(16)

我正在使用的填充颜色:

with each colour corresponding to a domain, and each shade to a level:
Greens <- c("#edf8e9", "#bae4b3", "#74c476", "#31a354", "#006d2c")

Reds <- c("#fee5d9", "#fcae91", "#fb6a4a", "#de2d26", "#a50f15")

Yellows <- c("#ffffeb","#ffff9d","#ffff89", "#ffff4e", "#ffff14")

Blues <- c("#eff3ff","#bdd7e7","#6baed6","#3182bd",  "#08519c")

编辑:geom_bar 也可以实现这一点,但不会按梯度分解。尝试使用this function :

ColourPalleteMulti <- function(df, group, subgroup){

  # Find how many colour categories to create and the number of colours in each
  categories <- aggregate(as.formula(paste(subgroup, group, sep="~" )), df, function(x) length(unique(x)))
  category.start <- (scales::hue_pal(l = 100)(nrow(categories))) # Set the top of the colour pallete
  category.end  <- (scales::hue_pal(l = 40)(nrow(categories))) # set the bottom

  # Build Colour pallette
  colours <- unlist(lapply(1:nrow(categories),
                           function(i){
                             colorRampPalette(colors = c(category.start[i], category.end[i]))(categories[i,2])}))
  return(colours)
}

colours <- ColourPalleteMulti(df, "Domain", "RespondentLevel") 
df %>% 
  ggplot(aes(x = fct_rev(Question_Code), y = RespondentLevel))+
  geom_bar(stat = "identity", aes(fill = Domain), alpha = .9) +
  coord_flip() +
  theme_minimal(16)+
  xlab(" ") +
  ggtitle("Baseline Report Card Sample Community")+
  scale_fill_manual("RespondentLevel", values = colours)+
  theme(legend.title = element_text(size = 14),
        legend.position = "none",
        legend.text = element_text(size = 14),
        plot.title = element_text(size=18, hjust = 0.5),
        plot.caption = element_text(size = 12, hjust = 1),
        axis.text.y = element_text(hjust = 0),
        panel.grid = element_line(colour = "#F0F0F0"),
        plot.margin = unit(c(1,1,0.5,1), "cm"))

enter image description here

抱歉,表述太长,如果可能的话可以调整

最佳答案

这里有一些技巧选项。首先,为了获得每个问题的完整级别集,以便数据中不存在空白,我使用了 tidyr::complete。这就是我将使用的数据框。

library(ggplot2)
library(dplyr)
library(tidyr)
library(purrr)
library(patchwork)

df_full <- df %>%
  complete(nesting(Domain, Question_Code), RespondentLevel) %>%
  mutate(RespondentLevel = as.character(RespondentLevel)) 

更简单的选择是通过更改 alpha 来近似渐变,并根据域设置色调(红色、绿色等)。这会放弃您选择的其他颜色,而仅使用每个调色板中最后一个最暗的颜色。

为此,我列出了所有调色板。在设置填充时,map_chr(palettes, 5) 提取每个列表的第 5 个元素,这是每个列表中最暗的颜色。您可能需要调整或删除一个或两个图例。

palettes <- list(Greens, Reds, Yellows, Blues)

ggplot(df_full, aes(x = RespondentLevel, y = Question_Code, fill = Domain, alpha = RespondentLevel)) +
  geom_tile() +
  theme_minimal() +
  facet_grid(rows = vars(Domain), scales = "free", space = "free") +
  scale_fill_manual(values = map_chr(palettes, 5))
#> Warning: Using alpha for a discrete variable is not advised.

更困难的方法是按域分割数据并制作绘图列表,然后将它们与 patchwork 包放在一起。好处是您可以保留完整的调色板,但缺点是控制从 facet_grid 获得的大小等内容更加困难,它会根据以下事实进行调整:某些领域比其他领域更重要。如果您认为这种方法值得,您可以在 plot_layout 中手动调整它们的大小。您还需要调整一些主题元素以模仿 facet_grid 的功能。

plot_list <- df_full %>%
  split(.$Domain) %>%
  map2(palettes, function(domain_df, pal) {
    ggplot(domain_df, aes(x = RespondentLevel, y = Question_Code, fill = RespondentLevel)) +
      geom_tile() +
      theme_minimal() +
      scale_fill_manual(values = pal) +
      theme(legend.position = "none") +
      labs(x = NULL, y = NULL)
  })

reduce(plot_list, `+`) +
  plot_layout(ncol = 1)

请注意,通常情况下,patchwork 将绘图像 plot1 +plot2 一样放在一起,以模仿 ggplot 分层。由于我将绘图放在列表中,因此我使用 purrr::reduce 来完成此操作。

关于r - 按组手动填充多个比例的geom_tile,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/55167464/

相关文章:

r - gganimate 循环之间的暂停

r - 不允许对 H2o 包中的字符串向量进行操作

r - 显示数据点在 x 和 y 轴上的位置

r - 插入符号训练函数中的 PCA 预处理参数

r - 如何使用ggplot2更改轴标签和刻度标签之间的间距?

r - 如何将图例值显示为百分比

reshape R 中的日期列

r - 动态侧边栏菜单 R Shiny

r - 在 ggplot 上显示 x 轴的特定值

r - 更改 ggplot 中的默认调色板