传单的闪亮应用:uiOutput在按下goButton之前不显示

时间:2015-11-11 14:36:00

标签: r leaflet shiny

我正在制作一个Shiny应用程序,其中传单地图通过时间动画,但您可以暂停它,然后使用滑块查看特定年份。我已经制作了虚拟版本的功能并在此处发布: https://seth127.shinyapps.io/slider

我的问题是,在你第一次点击goButton(暂停动画)之前,不会出现用于选择年份(在server.R中的renderUI内)的sliderInput。我似乎无法弄清楚为什么。

我希望它默认为2000年(输入$ animate == 0时)。我添加了一个文本输入来验证此功能是否可行,并且它适用于renderText,但不适用于renderUI。任何帮助深表感谢。代码如下:

server.R

require(maps)
require(leaflet)
require(shiny)

fakeData <- data.frame(year=seq(1974,2014,by=1), 
                   lat=seq(34, 40, by=0.1463415),
                   long=seq(-118,-73, by=1.097561),
                   artist="fake",
                   album="fake",
                   hometown="fake",
                   chart="PJ")

pickYear <- function(year, data) {
    yearCities <- data[as.numeric(data$year)==year, ]
    yearCities
}

shinyServer(
function(input, output) {
    #refresh animation every 60 seconds
     getit <- reactive({
        invalidateLater(60000, session=NULL)
        Sys.time()
    })
    #change animation year every 2 seconds
    year <- reactive({
        if(input$animate %% 2 != 0) {
            invalidateLater(2000, session=NULL)
            1984 + (round(as.numeric(Sys.time() - getit())/2))
        } else {1984 + (round(as.numeric(Sys.time() - getit())/2))}

        })


output$pressedGo <- reactive({if(input$animate==0) {"you haven't pressed go"} else {"now you have"}})

output$reactiveSlider <- renderUI({
    yearVal <- if(input$animate == 0) {2000} else {year()}
    sliderInput('year', label='Pick A Year:', value = yearVal,
                min = 1984, max = 2015, step = 1, sep="")

})

    output$map <- renderLeaflet({
            leaflet(data = pickYear(input$year, fakeData)) %>% addTiles() %>%
                addMarkers(~long, ~lat) %>% setView(-97.887318, 40.422487, 4) 
})

})

ui.R

require(maps)
require(leaflet)
require(shiny)

shinyUI(
pageWithSidebar(
    # Application title
    headerPanel(
        ""
    ),
    sidebarPanel(

    ),
    mainPanel(
        uiOutput("reactiveSlider"),
        actionButton('animate', "Animate/Pause Map"),
        h3(textOutput("pressedGo")),
        p(" "),
        leafletOutput("map")
    )
  )
)

1 个答案:

答案 0 :(得分:1)

不是对此问题的解释,而是一种潜在的替代方案 - 您可以使用闪亮的本机功能来执行您想要的操作:

sliderInput("animation", "Looping Animation:", 1984, 2015, 1, step = 1, 
                animate=animationOptions(interval=1, loop=T))

这里的关键是动画参数。请在此处查看更多示例:http://shiny.rstudio.com/articles/sliders.html