如何将R Shiny应用程序分解为模块?

时间:2019-02-22 21:54:39

标签: r shiny

因此,在我以前的question之一中,我对如何恢复书签和运行模型存在问题。这只是一个可复制的示例,但是作为一个应用程序,随着应用程序大小的不断增加,我想将其模块化。我有下面的代码。在模块1中,我想调用以渲染数据表,并在用户单击书签时调用模块2。到目前为止,我在模块1中具有无法正常工作的代码。模块2的代码在服务器部分。我如何模块化这个程序。

一个闪亮的应用程序的用例,其中用户可以输入一些值,并且在单击运行时它将运行一个模型并在表中显示值。现在,当我单击书签时,它将捕获输入值。当我单击恢复书签时,它确实会填充输入值。我想要做的是在恢复输入值后,它也应该再次运行模型并填充表中的值。并单击运行按钮以运行模型。

library(shiny)
library(RSQLite)
library(data.table)
library(DT)
library(dplyr)

#### Module 1 renders the first table
opFunc <- function(input, output, session, modelRun,modelData,budget){

  output$x1 <- DT::renderDataTable({
    modelRun()

      datatable(
        df %>% mutate(Current  = as.numeric(Current)*(budget())), selection = 'none', editable = TRUE
      )

  })
}
  tableUI <- function(id) {
    ns <- NS(id)
    dataTableOutput(ns("x1"))
  }

#### ideally the second module for bookmarks

opBookmark <- function(){}

ui <- function(request) {
  fluidPage(
    tableUI("opfun"),
    column(12,
      column(3,tags$div(title="forecast", numericInput("budget_input", label = ("Total Forecast"), value = 2))),
      column(2, textInput(inputId = "description", label = "Bookmark description", placeholder = "Data Summary")),
      column(2, bookmarkButton(id="bookmarkBtn"))),
      column(2, actionButton("opt_run", "Run")),
    tags$style(type='text/css', "#bookmarkBtn { width:100%; margin-top: 25px;}")
  )
}

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

  callModule( opFunc,"opfun",modelRun = reactive(input$opt_run),modelData = df,budget = reactive(input$budget_input))

  observeEvent(input$opt_run, {
    cat('HJE')
  })

  observeEvent(input$bookmarkBtn, {
    session$doBookmark()
  })
}
enableBookmarking(store = "url")
shinyApp(ui, server)

1 个答案:

答案 0 :(得分:1)

不幸的是,所提供的代码不是完全可复制的,也不是最少的,因此我继续尝试剥离我认为不必要的内容,并在您的其他文章中添加了df。我还将模块服务器名称从opFunc更改为tableMod,因为尝试使用具有不同UI和服务器名称的模块会令人困惑:)

以下代码按预期工作。

library(shiny)
library(DT)
library(dplyr)

#### Module 1 renders the first table
tableMod <- function(input, output, session, modelRun,modelData,budget){

  output$x1 <- DT::renderDataTable({
    modelRun()
    isolate(
      datatable(
        modelData %>% 
          mutate(Current  = as.numeric(Current)*(budget())),
        selection = 'none', editable = TRUE
      )
    )
  })
}
tableUI <- function(id) {
  ns <- NS(id)
  dataTableOutput(ns("x1"))
}

ui <- function(request) {
  fluidPage(
    tableUI("opfun"),
    numericInput("budget_input", "Total Forecast", value = 2),
    textInput(inputId = "description", "Bookmark description"),
    bookmarkButton(id="bookmarkBtn"),
    actionButton("opt_run", "Run")
  )
}

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

  df <- data.frame(Channel = c("A", "B","C"),
                   Current = c(2000, 3000, 4000),
                   Modified = c(2500, 3500,3000),
                   New_Membership = c(450, 650,700),
                   stringsAsFactors = FALSE)

  callModule( tableMod,"opfun",
              modelRun = reactive(input$opt_run),
              modelData = df,
              budget = reactive(input$budget_input))

  observeEvent(input$opt_run, {
    cat('HJE')
  })

  setBookmarkExclude("bookmarkBtn")
  observeEvent(input$bookmarkBtn, {
    session$doBookmark()
  })
}

shinyApp(ui, server, enableBookmarking = "url")