将ggplot树形图添加到绘图热图时控制共享图例

时间:2018-01-13 22:21:18

标签: r ggplot2 plotly legend heatmap

我有genes x samples个表达数据我想生成plotly heatmap并添加samples {{1} } dendrogram到。

以下是我的数据:

ggplot

这里是set.seed(1) mat <- matrix(rnorm(100*10),100,10,dimnames = list(paste0("G",1:100),paste0("S",1:10))) clustering

dendrograms

在这里,我使用library(dendsort) library(dplyr) col.hc <- hclust(dist(t(mat))) %>% dendsort::dendsort(.) col.dend <- as.dendrogram(col.hc) col.ord <- order.dendrogram(col.dend) row.hc <- hclust(dist(mat)) %>% dendsort::dendsort(.) row.dend <- as.dendrogram(row.hc) row.ord <- order.dendrogram(row.dend) mat <- mat[row.ord,col.ord] ggplot创建col.dend。请注意,所有dendextend关联的legendtext都会被屏蔽:

ticks

我在这里创建library(dendextend) library(ggplot2) col.gg.dend <- dendextend::as.ggdend(col.dend) col.gg.dend.ggplot <- ggplot(col.gg.dend,labels=F)+guides(fill=F)+theme_minimal()+ theme(axis.title=element_blank(),axis.text=element_blank(),axis.ticks=element_blank(),panel.grid=element_blank(),legend.position="none",legend.text=element_blank(),legend.background=element_blank(),legend.key=element_blank()) plotly并使用heatmap添加col.gg.dend.ggplot

plotly::subplot

给了我: enter image description here

除了将底部添加到library(plotly) library(reshape2) library(grDevices) plot.df <- reshape2::melt(mat,varnames=c("gene","sample"),value.name="value") heatmap.plot <- plot_ly(z=c(plot.df$value),x=plot.df$sample,y=plot.df$gene,colors=colorRamp(c("darkblue","white","darkred")),type="heatmap",colorbar=list(title="Expression",len=0.4)) %>% layout(yaxis=list(title="Gene"),xaxis=list(title="Sample")) empty.axis <- list(showticklabels=F,showgrid=F,zeroline=F,title=NULL) empty.plot <- plot_ly() %>% layout(margin=list(l=200),xaxis=empty.axis,yaxis=empty.axis) subplot(plotly_build(col.gg.dend.ggplot),empty.plot,heatmap.plot,nrows=2,margin=c(0,0,0,0),heights=c(0.2,0.8),widths=c(0.8,0.2)) heatmap legend(black,solid,1)之外,所有这一切都很有效,我想删除/禁止

请注意(NA,1)在没有plotly_build(col.gg.dend.ggplot)部分的情况下绘制dendrogram

2 个答案:

答案 0 :(得分:3)

一个相对简单的解决方法是:

subplot(col.gg.dend.ggplot,
        plotly_empty(), 
        heatmap.plot,
        nrows = 2,
        margin = c(0,0,0,0),
        heights = c(0.2,0.8),
        widths = c(0.8,0.2)) %>%
  layout(showlegend = FALSE)

enter image description here

SO question解释了潜在的问题。

  稍后在图表序列中找到的

布局选项将覆盖   在序列的前面找到的选项。

因为如果你只是颠倒了子图的顺序。

subplot(heatmap.plot,
        plotly_empty(), 
        col.gg.dend.ggplot,
        nrows = 2,
        margin = c(0,0,0,0),
        heights = c(0.2,0.8),
        widths = c(0.8,0.2))

enter image description here

神器消失了。

如果您手动指定不应在热图中绘制图例,则问题就会消失:

subplot(col.gg.dend.ggplot,
        plotly_empty(),
        heatmap.plot %>%
          layout(showlegend = F),
        nrows = 2,
        margin = c(0, 0, 0, 0),
        heights = c(0.2, 0.8),
        widths = c(0.8, 0.2))

enter image description here

并且颜色条向中间移动,表明热图贴图有一个不可见的图例,触发了树图的图例,因为它后来出现在子图的序列中。

请注意,在subplot中,您无需在ggplot对象上调用ggplotlyplotly_buildplotly_empty()可以调用空图。

避免此问题的另一种方法是使用ggdendro

library(ggdendro)
d.col <- dendro_data(col.dend)

col.2 <- ggplot() +
  geom_segment(data = d.col$segments, aes(x=x, y=y, xend=xend, yend=yend)) +
  labs(x = "", y = "") +
  theme_minimal() +
  theme(axis.text = element_blank(),
        axis.ticks = element_blank(),
        panel.grid = element_blank())

subplot(col.2,
        plotly_empty(), 
        heatmap.plot,
        nrows = 2,
        margin = c(0,0,0,0),
        heights = c(0.2,0.8),
        widths = c(0.8,0.2)) 

产生与第一张贴相同的情节。

答案 1 :(得分:1)

hotmaply软件包处理得很好(免责声明,我是贡献者):

library(heatmaply)
set.seed(1)
mat <- matrix(rnorm(100*10),100,10,dimnames = list(paste0("G",1:100),paste0("S",1:10)))

heatmaply(mat, dendrogram="column", col = cool_warm, key.title = "Expression", plot_method = "plotly")

但是,在没有设置plot_method="plotly时,我确实注意到了同样的问题。