Rmarkdown Shiny Limits

时间:2017-05-25 13:45:24

标签: r-markdown shiny

我有一个带有嵌入式闪亮应用程序(运行时:闪亮)的Rmarkdown文档,我想将其上传到shinyapps.io(最终)。当我在本地构建文档时,它无法完全构建,因为页面在文档的中途停止。我已经确认,如果我在文档中间删除了一些大的传单对象,那么构建就完成了。

我正在努力使传单对象变小,但我已经看到可以重新配置的Shiny应用程序有内存限制(options(shiny.maxRequestSize=30*1024^2)为30 MB)。据说这应该是应用程序的服务器部分,但如果整个文档是一个应用程序,这是在yaml,设置块还是其他地方?

我能够制作一个说明我的基本环境的MWE,尽管它没有重现错误。 maps块显示了50个州和DC中每个州的人口普查区的传单地图,然后是真正闪亮的应用程序。

---
title: "Test RMD"
output: html_document
runtime: shiny
---

```{r setup, include=FALSE}
knitr::opts_chunk$set(echo = TRUE)
library(leaflet)
library(shiny)
library(tigris)
library(htmltools)
library(RColorBrewer)
options(shiny.maxRequestSize=30*1024^2) 
```

# leaflet maps
```{r maps, echo=T,results='asis'}
us_states <- unique(fips_codes$state)[1:51] # for small, set to 2

createMaps <- function(state){
  stmap <- tracts(state, cb = TRUE)
  leaflet(stmap) %>% addTiles() %>%  addPolygons()
}

htmltools::tagList(lapply(us_states, function(x) createMaps(x) ))
```

# Shiny application

```{r tabsets, echo=FALSE}
shinyApp(
ui = bootstrapPage(
  tags$style(type = "text/css", "html, body {width:100%;height:100%}"),
  leafletOutput("map", width = "100%", height = "100%"),
  absolutePanel(top = 10, right = 10,
    sliderInput("range", "Magnitudes", min(quakes$mag), max(quakes$mag),
      value = range(quakes$mag), step = 0.1
    ),
    selectInput("colors", "Color Scheme",
      rownames(subset(brewer.pal.info, category %in% c("seq", "div")))
    ),
    checkboxInput("legend", "Show legend", TRUE)
  )
),

server = function(input, output, session) {

  # Reactive expression for the data subsetted to what the user selected
  filteredData <- reactive({
    quakes[quakes$mag >= input$range[1] & quakes$mag <= input$range[2],]
  })

  # This reactive expression represents the palette function,
  # which changes as the user makes selections in UI.
  colorpal <- reactive({
    colorNumeric(input$colors, quakes$mag)
  })

  output$map <- renderLeaflet({
    # Use leaflet() here, and only include aspects of the map that
    # won't need to change dynamically (at least, not unless the
    # entire map is being torn down and recreated).
    leaflet(quakes) %>% addTiles() %>%
      fitBounds(~min(long), ~min(lat), ~max(long), ~max(lat))
  })

  # Incremental changes to the map (in this case, replacing the
  # circles when a new color is chosen) should be performed in
  # an observer. Each independent set of things that can change
  # should be managed in its own observer.
  observe({
    pal <- colorpal()

    leafletProxy("map", data = filteredData()) %>%
      clearShapes() %>%
      addCircles(radius = ~10^mag/10, weight = 1, color = "#777777",
        fillColor = ~pal(mag), fillOpacity = 0.7, popup = ~paste(mag)
      )
  })

  # Use a separate observer to recreate the legend as needed.
  observe({
    proxy <- leafletProxy("map", data = quakes)

    # Remove any existing legend, and only if the legend is
    # enabled, create a new one.
    proxy %>% clearControls()
    if (input$legend) {
      pal <- colorpal()
      proxy %>% addLegend(position = "bottomright",
        pal = pal, values = ~mag
      )
    }
  })
}
)
```

我想我的主要问题是options()来电是否会在Shiny可以看到的地方进行。如果我将应用程序本身设置得更大,那么它也可能导致问题;我今天晚上可以试着去做。

0 个答案:

没有答案