R Shiny Plotly Animations how to execute automatically when loaded

时间:2017-08-04 13:08:55

标签: r shiny plotly

Question in short: how to run a Plotly Animation when fully loaded in the UI.R of a Shiny Web Application?

I'm trying to add an animation to my R Shiny Web Application, using Plot.ly's cumulative animations. I would like to execute the animation plot when loaded in the UI, but can't find a way to automatically run the plots.

Working example of a Shiny Web application below, which includes a Plot.ly cumulative animation, which runs when clicking the 'play' button and should be running automatically.

Help is highly appreciated!

UI.R

pageWithSidebar(
  sidebarPanel(
    'some controls'
  ),
  mainPanel(
    plotlyOutput("frontPage", width = "100%")
  )
)

server.R

library(shiny)
library(dplyr)

function(input, output, session) {
  accumulate_by <- function(dat, var) {
    var <- lazyeval::f_eval(var, dat)
    lvls <- plotly:::getLevels(var)
    dats <- lapply(seq_along(lvls), function(x) {
      cbind(dat[var %in% lvls[seq(1, x)], ], frame = lvls[[x]])
    })
    dplyr::bind_rows(dats)
  }

  d <- txhousing %>%
    filter(year > 2005, city %in% c("Abilene", "Bay Area")) %>%
    accumulate_by(~date)

  observe({
    output$frontPage <- renderPlotly({
    p <- d %>%
      plot_ly(
        x = ~date, 
        y = ~median,
        split = ~city,
        frame = ~frame, 
        type = 'scatter',
        mode = 'lines', 
        line = list(simplyfy = F)
      ) %>% 
      layout(
        xaxis = list(
          title = "Date",
          zeroline = F
        ),
        yaxis = list(
          title = "Median",
          zeroline = F
        )
      ) %>% 
      animation_opts(
        frame = 10, 
        transition = 5, 
        redraw = FALSE
      ) %>%
      animation_slider(
        hide = T
      ) %>%
      animation_button(
        x = 1, xanchor = "right", y = 0, yanchor = "bottom"
      )
    })
  })
}

1 个答案:

答案 0 :(得分:0)

这是一个很大的挑战!这可能不是唯一的方法。即使这晚了几年,也很难找到这些信息。我正在做一个类似的项目,所以回答这个问题对我很有用。

一些注意事项:

  • 如果仅用一帧渲染plot_ly,则按钮和滑块将被抑制。
  • 如果单独使用add_traces,以后使用动画效果会更容易。
  • id(必须唯一且具有字符)有助于设置动画来跟踪各个点。
  • 您可以使用reactTimer()触发事件,而无需用户干预。
  • 使用代理是更新图表的最佳方法。
  • 很难正确地为plotlyProxyInvoke嵌套列表结构。
  • 此示例实际上可能不需要动画,因为数据点没有移动。
  • 密谋参考很难。
  • 您必须提供每帧的帧和持续时间值。
library(shiny)
library(dplyr)
library(plotly)

ui <- fluidPage(
  # actionButton("go", "Advance"),
  plotlyOutput("frontPage", width = "100%")
)

server <- function(input, output, session) {

  accumulate_by <- function(dat, var) {
    var <- lazyeval::f_eval(var, dat)
    lvls <- plotly:::getLevels(var)
    dats <- lapply(seq_along(lvls), function(x) {
      cbind(dat[var %in% lvls[seq(1, x)], ], frame = lvls[[x]])
    })
    dplyr::bind_rows(dats)
  }

  cities <- c("Abilene", "Bay Area")
  colors <- c(I("blue"), I("orange"))

  d <- txhousing %>%
    filter(year > 2005, city %in% cities) %>%
    accumulate_by(~date)

  frames <- unique(d$frame)
  speed = 50

  r <- reactiveValues(
    i = 1
  )

    output$frontPage <- renderPlotly({
      isolate({
        # plot only one frame to avoid button and slider
        cat("first frame", frames[r$i], "\n")
        p <- plot_ly()
        for (i in seq_along(cities)){
          temp <- d %>%
            filter(frame==frames[r$i]) %>%
            filter(city==cities[i])
          p <- p %>%
            add_trace(
              x = temp$date,
              y = temp$median,
              ids = as.character(temp$date),
              name = cities[i],
              frame = temp$frame,
              type = 'scatter',
              mode = 'lines',
              line = list(color=colors[i], simplify=FALSE)
            )
        }
        p <- p %>%
          layout(
            xaxis = list(
              range = range(frames),
              title = "Date",
              zeroline = F
            ),
            yaxis = list(
              range = range(d$median),
              title = "Median",
              zeroline = F
            )
          ) %>%
          animation_opts(
            frame = speed,
            transition = speed,
            redraw = FALSE
          )
        p # return plot_ly
      }) # isolate
    }) # renderPlotly

    proxy <- plotlyProxy("frontPage", session=session, deferUntilFlush=FALSE)

    # https://shiny.rstudio.com/reference/shiny/0.14/reactiveTimer.html
    autoInvalidate <- reactiveTimer(speed)

    observe({
      autoInvalidate()
    })

    observeEvent(autoInvalidate(), {
      req(r$i<length(frames))
      r$i <- r$i + 1 # next frame
      cat("add frame", frames[r$i], "\n")
      f <- vector("list", length(cities))
      for (i in seq_along(cities)){
        temp <- d %>%
          filter(frame==frames[r$i]) %>%
          filter(city==cities[i])
        f[[i]] <- list(
          x = temp$date,
          y = temp$median,
          ids = as.character(temp$date),
          frame = temp$frame
        )
      }
      plotlyProxyInvoke(proxy, "animate",
                        # frameOrGroupNameOrFrameList
                        list(
                          data = f,
                          traces = as.list(as.integer(seq_along(f)-1)),
                          layout = list()
                        ),
                        # animationAttributes
                        list(
                          frame=as.list(rep(list(duration=speed), length(f))),
                          transition=as.list(rep(list(duration=speed), length(f)))
                        )
      )# plotlyProxyInvoke
    }) # observeEvent

}

shinyApp(ui, server)
相关问题