模块化R Shiny代码:模块中的ObserveEvent函数

时间:2018-11-27 03:51:49

标签: r shiny shiny-reactivity shinymodules

我正在尝试提高我的app.R代码在R Shiny中的可用性,这已经变得很长了。

本质上,我想创建一个模块(infras.R),以包含链接到checkboxInputs的大量watchEvent函数。

我了解我需要在app.R中获取模块,将observeEvent包装在一个函数中,在observeEvent函数中包含输入ID的名称空间(ns),并为该函数插入callModule。我还将callModule封装在ObserveEvent中,以便其功能持久存在,并且不会在启动Webapp后仅触发一次。

正在运行的app.R输出以下错误,但我不确定如何解决:

Warning: Error in proxy: could not find function "proxy"
   81: eval
   80: eval
   79: %>%
   78: module [infras.R#153]
   73: callModule
   72: observeEventHandler  
    1: runApp

感谢您的协助,因为我发现查找有关如何执行此操作的文献非常困难。

我的R脚本中的关键片段。

基础设施R(已更新):

icons_pow <- awesomeIcons(
  iconColor = 'white',
  markerColor = 'green',
  text = "m"
)

mod <- function(input, output, session, pow_id, prox){

observeEvent(pow_id(),{
  if(pow_id() != 0){
     pow_id <- readOGR("../geospatial_files/ind", layer = "plants")
     pow_iddf <- as.data.frame(pow_id)
     prox %>%
       addAwesomeMarkers(lng=pow_iddf$coords.x1, lat=pow_iddf$coords.x2, group = "pow_idg", icon=icons_pow,
                    label = paste(pow_iddf$Name,pow_iddf$Power_type,sep = ", "))
  }
  else {prox %>% clearGroup("pow_idg") %>% removeControl(layerId="pow_idc")
  }
}
)
}

app.R(已更新):

...
source("infras.R")
...

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

proxy <- leafletProxy("map")
callModule(mod, "mod", reactive(input$pow_id), proxy)


  })
...

}

1 个答案:

答案 0 :(得分:1)

您需要将input对象包装到reactive中,并将其用作模块的 input 参数。另一个输入参数是您的传单代理。在模块内部,您可以使用observe更改您的代理,然后立即对其进行更新:

library(shiny)
library(leaflet)
library(RColorBrewer)

# The module containing the observer. Input is the reactive handle of legend input and the proxy
mod <- function(input, output, session, legend, prox){

  observe({
    prox %>% clearControls()
    if (legend()) {
      prox %>% addLegend(position = "bottomright",
                            pal = colorNumeric("Blues", quakes$mag), values = ~mag
      )
    }
  })

}

ui <- bootstrapPage(
  checkboxInput("legend", "Show legend", TRUE),
  tags$style(type = "text/css", "html, body {width:100%;height:100%}"),
  leafletOutput("map", width = "100%", height = "100%")
)

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

  output$map <- renderLeaflet({
    pal <- colorNumeric("Blues", quakes$mag)
    leaflet(quakes) %>% addTiles() %>%      
      addCircles(radius = ~10^mag/10, weight = 1, color = "#777777",
                 fillColor = ~pal(mag), fillOpacity = 0.7, popup = ~paste(mag)) %>% 
      fitBounds(~min(long), ~min(lat), ~max(long), ~max(lat))
  })

  # This is the handle for map
  proxy <- leafletProxy("map", data = quakes)
  callModule(mod, "mod", reactive(input$legend), proxy)


}

shinyApp(ui, server)

enter image description here