R Shiny:ggplot中的工具提示

时间:2016-08-17 09:02:42

标签: r ggplot2 shiny tooltip

当我将鼠标悬停在图表中的某个点上时,我希望显示高度或重量的值。我已经尝试使用spark.ml包和此link的示例来完成此工作。但我遇到了各种错误,我不知道如何让它发挥作用。

我已经包含了我的全部代码,所以我希望有人可以帮我解决这个问题。

model.avgMetrics

部分数据:

plotly

1 个答案:

答案 0 :(得分:4)

我使用了this工具提示并对其进行了一些定制。

您的情节最初没有显示,因为您没有返回任何情节。我在不调用p函数的情况下返回ggplot对象print

一般来说,我对代码进行了大量修改,结果就是:

enter image description here

由于函数nearPoints需要传递给ggplot的相同数据集,我必须创建一个新的reactive,我在其中对数据进行了一些子集化和重新整形。

而不是grid.arrange创建两个单独的图我使用facet_grid(因此我必须转换数据)。我也用颜色来区分线条。

使用您提供的示例数据,一切正常。

完整示例:

rm(ui)
rm(server)

library("shiny")
library("ggplot2")
library('readxl')
library('gridExtra')
library(reshape) # for "melt"

ui<- fluidPage(
  titlePanel("Animals"),
  sidebarLayout(
    sidebarPanel(
      helpText("Create graph of height and/or weight animals"),
      selectInput("location", 
                  label = "Choose a location",
                  choices = list("New York"="New York", "Philadelphia" = "Philadelphia"),
                  selected = "New York"),
      uiOutput("animal"),
      checkboxGroupInput("opti", 
                         label = "Option",
                         choices = c("weight", "height"),
                         selected = "weight")
    ),
    mainPanel(

      # this is an extra div used ONLY to create positioned ancestor for tooltip
      # we don't change its position
      div(
        style = "position:relative",
        plotOutput("graph", 
                   hover = hoverOpts("plot_hover", delay = 100, delayType = "debounce")),
        uiOutput("hover_info")
      )

    )
  ))

server <- function(input, output){

  animal <- read_excel('data/animals.xlsx', sheet =1)
  #animal <- read_excel("~/Downloads/test2.xlsx")
  var <- reactive({
    switch(input$location,
           "New York" = c("Cat1", "Dog2"),
           "Philadelphia"= c("Cat4","Dog3"))
  })

  output$animal <- renderUI({
    checkboxGroupInput("anim", "Choose an animal",
                       var())
  })


  output$graph <- renderPlot({
    req(input$anim, sub())

    if (length(input$anim) == 1) {
      p <- ggplot(sub(), aes(x = date, colour = variable))
      p <- p + geom_line(aes(y = value)) + 
               geom_point(aes(y = value)) +
        guides(colour = guide_legend(title = NULL))

      return(p) # you have to return the plot
    }

    if (length(input$anim) == 2) {

      p <- ggplot(sub(), aes(x = date, colour = variable)) +
        geom_line(aes(y = value)) + 
        geom_point(aes(y = value)) + 
        facet_grid(~ Name) + 
        guides(colour = guide_legend(title = NULL))

      return(p) # you have to return the plot
    }
  })

  observe({
    print(sub())
  })


  sub <- reactive({
    req(input$anim)

    if (length(input$anim) == 1) {

      df <- animal[animal$Name %in% input$anim & animal$Location %in% input$location, ]
      df <- melt(as.data.frame(df), measure.vars = c("weight", "height"))
      df <- subset(df, df$variable %in% input$opti)
      return(df)
    }

    if (length(input$anim) == 2) {
      df <- animal[animal$Name %in% input$anim & animal$Location %in% input$location, ]
      df$Name <- factor(df$Name)
      df <- melt(as.data.frame(df), measure.vars = c("weight", "height"))
      df <- subset(df, df$variable %in% input$opti)
      return(df)
    }
  })

  output$hover_info <- renderUI({
    hover <- input$plot_hover
    point <- nearPoints(sub(), hover, threshold = 5, maxpoints = 1, addDist = TRUE)

    if (nrow(point) == 0) return(NULL)

    left_pct <- (hover$x - hover$domain$left) / (hover$domain$right - hover$domain$left)
    top_pct <- (hover$domain$top - hover$y) / (hover$domain$top - hover$domain$bottom)

    left_px <- hover$range$left + left_pct * (hover$range$right - hover$range$left)
    top_px <- hover$range$top + top_pct * (hover$range$bottom - hover$range$top)

    style <- paste0("position:absolute; z-index:100; background-color: rgba(245, 245, 245, 0.85); ",
                    "left:", left_px + 2, "px; top:", top_px + 2, "px;")

    wellPanel(
      style = style,
      p(HTML(paste0("<b>", point$variable, ": </b>", point$value)))
    )
  })


}
shinyApp(ui = ui, server = server)