如何在 ggplotly 动画中添加注释?

How can I add annotation in ggplotly animation?

我正在为我在 r 中的作业创建动画绘图,我在其中比较具有不同观测值的多个模型。我想添加注释以显示当前模型的 RMSE - 这意味着我希望文本随滑块一起变化。有什么简单的方法可以做到这一点吗?

这是我存储在 GitHub 上的数据集。已经使用 RMSE 创建了变量:data

基础ggplot图形如下:

library(tidyverse)
library(plotly)
p <- ggplot(values_predictions, aes(x = x))  +
    geom_line(aes(y = preds_BLR, frame = n, colour = "BLR")) +
    geom_line(aes(y = preds_RLS, frame = n, colour = "RLS")) + 
    geom_point(aes(x = x, y = target, frame = n, colour = "target"), alpha = 0.3) + 
    geom_line(aes(x = x, y = sin(2 * pi * x), colour = "sin(2*pi*x)"), alpha = 0.3)  +
    ggtitle("Comparison of performance) + 
    labs(y = "predictions and targets", colour = "colours")

这里转成plotly,我在Plotly图中添加了动画:

plot <- ggplotly(p) %>%
        animation_opts(easing = "linear",redraw = FALSE)
plot

谢谢!

您可以使用 annotate 函数向 ggplot 图添加注释:http://ggplot2.tidyverse.org/reference/annotate.html

df <- data.frame(x = rnorm(100, mean = 10), y = rnorm(100, mean = 10))

# Build model
fit <- lm(x ~ y, data = df)

# function finds RMSE
RMSE <- function(error) { sqrt(mean(error^2)) }

library(ggplot2)
ggplot(df, aes(x, y)) +
  geom_point() +
  annotate("text",  x = Inf, y  = Inf, hjust = 1.1, vjust = 2, 
           label = paste("RMSE", RMSE(fit$residuals)) )

在 ggplot 和 plotly 之间转换似乎有点问题。但是,此解决方法 here 显示了可以使用的解决方法:

ggplotly(plot) %>%
  layout(annotations = list(x = 12, y = 13, text = paste("RMSE",
    RMSE(fit$residuals)), showarrow = F))

这是一个使用内置的鸢尾花数据集将数据相关文本添加到 ggplotly 的示例。

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

mydata = iris %>% rename(variable1=Sepal.Length, variable2= Sepal.Width)

shift_right = 0.1 # number from 0-1 where higher = more right
shift_down = 0.02 # number from 0-1 where higher = more down

p = ggplot(mydata, aes(variable1,variable2))+
    annotate(geom = "text",
             label = paste0("Cor = ",as.character(round(cor.test(mydata$variable1,mydata$variable2)$estimate,2))),
             x = min(mydata$variable1)+abs(shift_right*(min(mydata$variable1)-max(mydata$variable1))), 
             y =  max(mydata$variable2)-abs(shift_down*(min(mydata$variable2)-max(mydata$variable2))), size=4)+
    geom_point()

ggplotly(p) %>%  style(hoverinfo = "none", traces = 1) # remove hover on text