如何使用annotation_custom()在图形区域的精确位置放置grobs?

24

我正在尝试使用ggplot2重现以下[基本R]图表:

enter image description here

我已经成功实现了大部分内容,但目前让我困惑的是将连接右侧边际地毯图和相应标签的线段放置在何处。标签已通过anotation_custom()绘制(如下图所示),并且我使用了@baptiste的技巧关闭裁剪以允许在图形边缘绘制。

尽管我尝试了很多次,但我无法将segmentGrobs()放置在设备中所需的位置,以便它们与正确的地毯刻度和标签相连。

一个可重现的示例:

y <- data.frame(matrix(runif(30*10), ncol = 10))
names(y) <- paste0("spp", 1:10)
treat <- gl(3, 10)
time <- factor(rep(1:10, 3))

require(vegan); require(grid); require(reshape2); require(ggplot2)
mod <- prc(y, treat, time)

如果您没有安装vegan,我会在问题的末尾附上一个强化对象的dput,并提供一个fortify()方法,以便您可以运行示例并使用ggplot()进行方便的绘图。我还包括了一个相当冗长的函数myPlt(),它说明了我目前的工作情况,如果您加载了软件包并且可以创建mod,则可以对示例数据集使用它。
我已经尝试了很多选项,但现在似乎在黑暗中挣扎,无法正确放置线段。
我不是在寻找解决示例数据集绘制标签/线段的特定问题的解决方案,而是通用解决方案,可以在程序中自动放置线段和标签,因为这将构成class(mod)对象的autoplot()方法的基础。我已经解决了标签的问题,只是没有解决线段的问题。所以问题如下:
1. 当我想要放置包含从数据coord x0,y0到x1,y1运行的线的片段grob时,如何使用xmin,xmax,ymin,ymax参数? 2. 或许可以这样问,如何使用annotation_custom()在已知数据坐标x0,y0至x1,y1之间绘制位于图形区域外部的线段?
我将很高兴接收任何在图形区域中具有任何旧绘图的答案,但显示如何在图形边缘之间添加线段。
如果有更好的解决方案可用,我不会固守使用annotation_custom()。我确实想避免标签位于绘图区域中; 我认为可以通过使用annotate()并通过expand参数扩展x轴限制来实现这一点。
fortify()方法
fortify.prc <- function(model, data, scaling = 3, axis = 1,
                        ...) {
    s <- summary(model, scaling = scaling, axis = axis)
    b <- t(coef(s))
    rs <- rownames(b)
    cs <- colnames(b)
    res <- melt(b)
    names(res) <- c("Time", "Treatment", "Response")
    n <- length(s$sp)
    sampLab <- paste(res$Treatment, res$Time, sep = "-")
    res <- rbind(res, cbind(Time = rep(NA, n),
                            Treatment = rep(NA, n),
                            Response = s$sp))
    res$Score <- factor(c(rep("Sample", prod(dim(b))),
                          rep("Species", n)))
    res$Label <- c(sampLab, names(s$sp))
    res
}

dput()函数

fortify.prc(mod)的输出如下:

structure(list(Time = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 
3, 4, 5, 6, 7, 8, 9, 10, NA, NA, NA, NA, NA, NA, NA, NA, NA, 
NA), Treatment = c(2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 3, 3, 3, 3, 
3, 3, 3, 3, 3, 3, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), Response = c(0.775222658013234, 
-0.0374860102875694, 0.100620532505619, 0.17475403767196, -0.736181209242918, 
1.18581913245908, -0.235457236665258, -0.494834646295896, -0.22096700738071, 
-0.00852429328460645, 0.102286976108412, -0.116035743892094, 
0.01054849999509, 0.429857364190398, -0.29619258318138, 0.394303081010858, 
-0.456401545475929, 0.391960511587087, -0.218177702859661, -0.174814586471715, 
0.424769871360028, -0.0771395073436865, 0.698662414019584, 0.695676522106077, 
-0.31659375422071, -0.584947748238806, -0.523065304477453, -0.19259357510277, 
-0.0786143714402391, -0.313283220381509), Score = structure(c(1L, 
1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 
1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c("Sample", 
"Species"), class = "factor"), Label = c("2-1", "2-2", "2-3", 
"2-4", "2-5", "2-6", "2-7", "2-8", "2-9", "2-10", "3-1", "3-2", 
"3-3", "3-4", "3-5", "3-6", "3-7", "3-8", "3-9", "3-10", "spp1", 
"spp2", "spp3", "spp4", "spp5", "spp6", "spp7", "spp8", "spp9", 
"spp10")), .Names = c("Time", "Treatment", "Response", "Score", 
"Label"), row.names = c("1", "2", "3", "4", "5", "6", "7", "8", 
"9", "10", "11", "12", "13", "14", "15", "16", "17", "18", "19", 
"20", "spp1", "spp2", "spp3", "spp4", "spp5", "spp6", "spp7", 
"spp8", "spp9", "spp10"), class = "data.frame")

我尝试过的:

myPlt <- function(x, air = 1.1) {
    ## fortify PRC model
    fx <- fortify(x)
    ## samples and species scores
    sampScr <- fx[fx$Score == "Sample", ]
    sppScr <- fx[fx$Score != "Sample", ]
    ord <- order(sppScr$Response)
    sppScr <- sppScr[ord, ]
    ## base plot
    plt <- ggplot(data = sampScr,
                  aes(x = Time, y = Response,
                      colour = Treatment, group = Treatment),
                  subset = Score == "Sample")
    plt <- plt + geom_line() + # add lines
            geom_rug(sides = "r", data = sppScr) ## add rug
    ## species labels
    sppLab <- sppScr[, "Label"]
    ## label grobs
    tg <- lapply(sppLab, textGrob, just = "left")
    ## label grob widths
    wd <- sapply(tg, function(x) convertWidth(grobWidth(x), "cm",
                                              valueOnly = TRUE))
    mwd <- max(wd) ## largest label

    ## add some space to the margin, move legend etc
    plt <- plt +
        theme(plot.margin = unit(c(0, mwd + 1, 0, 0), "cm"),
              legend.position = "top",
              legend.direction = "horizontal",
              legend.key.width = unit(0.1, "npc"))
    ## annotate locations
    ##  - Xloc = new x coord for label
    ##  - Xloc2 = location at edge of plot region where rug ticks met plot box
    Xloc <- max(fx$Time, na.rm = TRUE) +
        (2 * (0.04 * diff(range(fx$Time, na.rm = TRUE))))
    Xloc2 <- max(fx$Time, na.rm = TRUE) +
        (0.04 * diff(range(fx$Time, na.rm = TRUE)))
    ## Yloc - where to position the labels in y coordinates
    yran <- max(sampScr$Response, na.rm = TRUE) -
        min(sampScr$Response, na.rm = TRUE)
    ## This is taken from vegan:::linestack
    ## attempting to space the labels out in the y-axis direction
    ht <- 2 * (air * (sapply(sppLab,
                        function(x) convertHeight(stringHeight(x),
                                                  "npc", valueOnly = TRUE)) *
                 yran))
    n <- length(sppLab)
    pos <- numeric(n)
    mid <- (n + 1) %/% 2
    pos[mid] <- sppScr$Response[mid]
    if (n > 1) {
        for (i in (mid + 1):n) {
            pos[i] <- max(sppScr$Response[i], pos[i - 1] + ht[i])
        }
    }
    if (n > 2) {
        for (i in (mid - 1):1) {
            pos[i] <- min(sppScr$Response[i], pos[i + 1] - ht[i])
        }
    }
    ## pos now contains the y-axis locations for the labels, spread out

    ## Loop over label and add textGrob and segmentsGrob for each one
    for (i in seq_along(wd)) {
        plt <- plt + annotation_custom(tg[[i]],
                                       xmin = Xloc,
                                       xmax = Xloc,
                                       ymin = pos[i],
                                       ymax = pos[i])
        seg <- segmentsGrob(Xloc2, pos[i], Xloc, pos[i])

        ## here is problem - what to use for ymin, ymax, xmin, xmax??
        plt <- plt + annotation_custom(seg,
                                       ## xmin = Xloc2,
                                       ## xmax = Xloc,
                                       ## ymin = pos[i],
                                       ## ymax = pos[i])
                                       xmin = Xloc2,
                                       xmax = Xloc,
                                       ymin = min(pos[i], sppScr$Response[i]),
                                       ymax = max(pos[i], sppScr$Response[i]))
    }
    ## Build the plot
    p2 <- ggplot_gtable(ggplot_build(plt))
    ## turn off clipping
    p2$layout$clip[p2$layout$name=="panel"] <- "off"
    ## draw plot
    grid.draw(p2)
}

基于我在myPlt()中尝试的结果

这是我使用上面提到的myPlt()所做的进展。请注意标签上绘制的小水平刻度线 - 这些应该是上面第一个图中的倾斜线段。

enter image description here


1
我认为annotation_custom和关闭剪辑不是一个好的选择。你考虑过这种类型的例子吗? - baptiste
谢谢@baptiste,我一开始没有考虑到在视口上排列两个图表的一般想法,但是因为我认为一个图表上的图例会使得两个图表难以对齐而将其排除。我会查看你提供的示例。不过我仍然想了解annotation_custom()的工作原理。假设我想在绘图区域内放置一条连接两个已知坐标的线段。我知道如何使用annotate来实现这一点,但不知道如何使用annotation_custom()。我不明白它们之间的区别。 - Gavin Simpson
如果您愿意尝试一种不同的解决方案,其中包含在绘图区域内精美排列的标签,请考虑使用ggrepel。https://dev59.com/z10b5IYBdhLWcg3wSPqL#45631834 - Mark Neal
2个回答

24
这是我处理此问题的方法:
library(gtable)
library(ggplot2)
library(plyr)

set.seed(1)
d <- data.frame(x=rep(1:10, 5),
                y=rnorm(50),
                g = gl(5,10))

# example plot
p <- ggplot(d, aes(x,y,colour=g)) +
  geom_line() +
  scale_x_continuous(expand=c(0,0))+
  theme(legend.position="top",
        plot.margin=unit(c(1,0,0,0),"line"))

# dummy data for the legend plot
# built with the same y axis (same limits, same expand factor)
d2 <- ddply(d, "g", summarise, x=0, y=y[length(y)])
d2$lab <- paste0("line #", seq_len(nrow(d2)))

plegend <- ggplot(d, aes(x,y, colour=g)) +
  geom_blank() +
  geom_segment(data=d2, aes(x=2, xend=0, y=y, yend=y), 
               arrow=arrow(length=unit(2,"mm"), type="closed")) +
  geom_text(data=d2, aes(x=2.5,label=lab), hjust=0) +
  scale_x_continuous(expand=c(0,0)) +
  guides(colour="none")+
  theme_minimal() + theme(line=element_blank(),
                          text=element_blank(),
                          panel.background=element_rect(fill="grey95", linetype=2))

# extract the panel only, we don't need the rest
gl <- gtable_filter(ggplotGrob(plegend), "panel")

# add a cell next to the main plot panel, and insert gl there
g <- ggplotGrob(p)
index <- subset(g$layout, name == "panel")
g <- gtable_add_cols(g, unit(1, "strwidth", "line # 1") + unit(1, "cm"))
g <- gtable_add_grob(g, gl, t = index$t, l=ncol(g), 
                     b=index$b, r=ncol(g))
grid.newpage()
grid.draw(g)

enter image description here

将“图例”绘图与特定标签和位置相结合应该很简单(留给感兴趣的读者作为练习)。


9
请注意:这不是鼓励违反有关次要轴的法律。它们仍然是非法的。 - baptiste

11

也许这个可以说明annotation_custom的用法,

myGrob <- grobTree(rectGrob(gp=gpar(fill="red", alpha=0.5)),
                   segmentsGrob(x0=0, x1=1, y0=0, y1=1, default.units="npc"))

myGrob2 <- grobTree(rectGrob(gp=gpar(fill="blue", alpha=0.5)),
                   segmentsGrob(x0=0, x1=1, y0=0, y1=1, default.units="npc"))

p <- qplot(1:10, 1:10) + theme(plot.margin=unit(c(0, 3, 0, 0), "cm")) +
  annotation_custom(myGrob, xmin=5, xmax=6, ymin=3.5, ymax=5.5) +
  annotate("segment", x=5, xend=6, y=3, yend=5, colour="red") +
  annotation_custom(myGrob2, xmin=8, xmax=12, ymin=3.5, ymax=5.5) 

p

g <- ggplotGrob(p)
g$layout$clip[g$layout$name=="panel"] <- "off"
grid.draw(g)

在这里输入图片描述

很明显存在一个奇怪的错误,如果我重复使用myGrob而不是myGrob2,第二次它会忽略定位坐标并将其与第一层堆叠。 这个函数真的很有缺陷。


真的吗??要么我看错了问题(我会给它投反对票:),要么你忘记了一句话:“如果有更好的解决方案,我也会考虑”。 - baptiste
我确实考虑过。我对grob的放置特别困惑。我认为两个答案都很好,但这本质上解决了我如何放置grob的问题,这也是Q的标题。我一直在假设如何放置grob,这种假设是错误的。不确定你有什么理由投反对票-不是你会做事情的方式,这里没有投反对票的理由。 - Gavin Simpson
2
开玩笑的,我非常 讨厌 annotation_custom 中的错误和 hacky clip-off trick。而这两个都是我首先引入的罪魁祸首。 - baptiste
也许我应该给你的某个东西投反对票,作为“特性”的赎罪?;-) - Gavin Simpson

网页内容由stack overflow 提供, 点击上面的
可以查看英文原文,
原文链接