多面 ggplot 华夫饼图中的手动色标

Manual colour scale in faceted ggplot waffle chart

我正在尝试使用 https://github.com/hrbrmstr/waffleggplot2::facet_wrap 中的包 waffle 在 R 中为多面华夫饼图获得相同的自定义色标。

下面是一个可重现的例子:

foo <- 
  data.frame(Genus = c("Hemipenthes","Thecophora","Cheilosia","Cheilosia","Chrysotoxum","Chrysotoxum","Dasysyrphus","Dasysyrphus","Didea","Episyrphus","Eristalis","Eristalis","Eumerus","Eumerus","Eupeodes","Eupeodes","Helophilus","Megasyrphus","Melanostoma","Meliscaeva","Merodon","Merodon","Myathropa","Neoascia","Parasyrphus","Parasyrphus","Platycheirus","Scaeva","Scaeva","Sphaerophoria","Sphaerophoria","Syrphus","Syrphus","Xanthandrus","Andrena","Apis","Bombus","Bombus","Ceratina","Lasioglossum","Lasioglossum","Sphecodes","Sphecodes","Polistes","Macroglossum","Macroglossum","Polyommatus","Aglais","Argynnis","Lasiommata","Lasiommata","Adscita","Thrips","Thrips"), 
             Ploidy = c("4x","4x","4x","8x","4x","8x","4x","8x","8x","4x","4x","8x","4x","8x","4x","8x","4x","4x","8x","4x","4x","8x","4x","8x","4x","8x","8x","4x","8x","4x","8x","4x","8x","4x","4x","8x","4x","8x","8x","4x","8x","4x","8x","8x","4x","8x","4x","8x","4x","4x","8x","4x","4x","8x"), 
             n = as.numeric(c("2","2","0","0","38","0","2","0","0","0","569","35","0","0","63","8","0","2","3","4","20","1","2","1","17","0","2","9","0","21","4","48","61","1","25","15","0","0","0","38","5","0","0","0","0","0","4","1","0","21","2","1","0","0")), 
             stringsAsFactors = F)
foo$Genus <- factor(foo$Genus, levels = unique(foo$Genus))
foo$Ploidy <- factor(foo$Ploidy, levels = c("4x", "8x"))

bar <- 
  data.frame(Genus = c("Hemipenthes","Thecophora","Cheilosia","Chrysotoxum","Dasysyrphus","Didea","Episyrphus","Eristalis","Eumerus","Eupeodes","Helophilus","Megasyrphus","Melanostoma","Meliscaeva","Merodon","Myathropa","Neoascia","Parasyrphus","Platycheirus","Scaeva","Sphaerophoria","Syrphus","Xanthandrus","Andrena","Apis","Bombus","Ceratina","Lasioglossum","Sphecodes","Polistes","Macroglossum","Polyommatus","Aglais","Argynnis","Lasiommata","Adscita","Thrips"), 
                  colour = c("#F2F5EA","#E6ECD5","#DAE2C0","#CED9AC","#C2CF97","#B5C682","#A9BC6E","#9DB359","#91A944","#85A030","#79961B","#739211","#6E8B10","#69850F","#647E0E","#5F780E","#5A720D","#556B0C","#50650B","#4B5F0B","#46580A","#415209","#3C4C08","#F4C0B7","#E98170","#DE4328","#d92405","#BA1E04","#9B1903","#7C1402","#7897F1","#3563EB","#3563eb","#2C52C3","#23429C","#1A3175","#eac124"), 
                  stringsAsFactors = F)
bar$Genus <- factor(bar$Genus, levels = unique(bar$Genus))

调色板如下所示:

barplot(rep(1, nrow(bar)), col = bar$colour, names.arg = bar$Genus, las = 2, cex.names = .75)

请注意,两个数据集中值的顺序和级别都相同:

all(unique(foo$Genus) == unique(bar$Genus))
TRUE

我现在将两个数据集连接在一起:

foobar <- plyr::join(foo, bar) # preserves row order

然后我用华夫饼绘制这个:

library(ggplot)
library(waffle)
library(hrbrthemes)
ggplot(foobar, aes(fill = Genus, values = n)) + 
  geom_waffle(colour = "white", n_rows = 20, flip = T) + 
  facet_wrap(.~Ploidy, nrow = 1, strip.position = "bottom") +
  scale_fill_manual(values = foobar$colour, name = NULL) +
  scale_x_discrete() +
  scale_y_continuous(labels = function(x) x * 20, expand = c(0,0)) +
  coord_equal() +
  theme_minimal(base_family = "Roboto Condensed") +
  theme(panel.grid = element_blank(), axis.ticks.y = element_line()) +
  guides(fill = guide_legend(reverse = T))

但是,颜色与指定的填充不对应 (Genus)。 例如,绘制的图例的前 4 个条目(Adscita、Lasiommata、Aglais、Polyommatus)应该是蓝色阴影,而不是绿色。此外,Genus 的某些级别已被完全删除,例如 Cheilosia、Bombus 和 Didea。使用其他 geom 或删除 facet 时,此行为仍然存在。

期望的结果是 Genus 变量的每个唯一值在两个方面具有相同的颜色,如在 bar 中的自定义调色板中分配并在上面的条形图中可视化。

这就是你想要的?使用 scale_fill_identity(drop = FALSE)

通常最好只使用您的变量进行审美,然后使用 scale_..._manual 中的命名向量将颜色映射到它。我现在已经将命名向量添加为标签。 drop = FALSE 显示未使用的级别

library(ggplot2)
#devtools::install_github("hrbrmstr/waffle")
library(waffle)

a <- unique(as.character(foobar$Genus))
names(a) <- unique(foobar$colour)

ggplot(foobar, aes(fill = colour, values = n)) + 
  geom_waffle(colour = "white", n_rows = 20, flip = T) + 
  facet_wrap(.~Ploidy, nrow = 1, strip.position = "bottom") +
  scale_fill_identity(guide = 'legend', labels = a, drop = FALSE) +
  labs(fill = 'Genus') +
  scale_y_continuous(labels = function(x) x * 20, expand = c(0,0)) +
  coord_equal() 

reprex package (v0.3.0)

于 2020-03-06 创建

多亏了Tjebo,我才得以解决问题。在这里发布后代的结果:

ggplot(foobar, aes(fill = colour, values = n)) + 
  geom_waffle(colour = "white", n_rows = 20, flip = T) + 
  facet_wrap(.~Ploidy, nrow = 1, strip.position = "bottom") +
  scale_fill_identity(guide = 'legend', labels = a, breaks = bar$colour, drop = FALSE) +
  labs(fill = 'Genus') +
  coord_equal() + 
  scale_x_discrete() +
  scale_y_continuous(labels = function(x) x * 20, expand = c(0,0)) +
  theme_minimal(base_family = "Roboto Condensed") +
  theme(panel.grid = element_blank(), axis.ticks.y = element_line()) +
  guides(fill = guide_legend(reverse = T))

现在图例与自定义调色板 bar$colour 正确对应,并且显示顺序与原始因子 bar$Genus 相同。