我如何从Shiny应用程序中的渲染功能外部汇总反应性数据?

问题描述 投票:0回答:1

对于这个特别的闪亮示例,我试图应用一个圆形模型,并在ggplot和摘要表中显示和汇总它。这一直很简单,直到尝试添加反应式“画笔”功能。每个数据点都代表一个日期,选择图的点应能够丢弃不希望的日期。据我所知,这要求过滤和模型拟合在renderPlot之内,这会导致复杂的问题(无法找到数据/模型),试图在外部调用过滤后的数据和循环模型的统计输出功能和/或在另一个反应功能中。这产生了Error: object 'k_circ.lm' not found,所以我的问题是:

  1. 如何从renderPlot功能中读取过滤后的数据到summarytable矩阵?
  2. 如何类似地将拟合的模型值和k_circ.lm中的残差相加?
  3. 是否有更好或更简单的方式来安排应用来避免这种情况?

为工作表(如果格式不正确)汇总表注释掉了备用代码行。

library(dplyr)           # For data manipulation
library(ggplot2)         # For drawing plots
library(shiny)           # For running the app
library(plotly)          # For data manipulation         
library(circular)        # For Circular regressions

# Define UI ----
ui <- fluidPage(

  # App title ----
  titlePanel("Circular Brushplot Demo"),

  # Sidebar layout with input and output definitions ----
  sidebarLayout(
    sidebarPanel(
      actionButton("exclude_toggle", "Toggle points"),
      actionButton("exclude_reset", "Reset")
    ),


  # Main panel for displaying outputs ----
  mainPanel(

      #reactive plot output with point and 'brush' selection
      fluidRow(plotOutput("k", height = 400,
                          click = "k_click",
                          brush = brushOpts(
                            id = "k_brush" ))),
      plotOutput("s", height = 400)
    )
  )
)

# Define server logic 
server <- function(input, output) {

  psideg <- c(356,97,211,232,343,292,157,302,335,302,324,85,324,340,157,238,254,146,232,122,329)
  thetadeg <- c(119,162,221,259,270,29,97,292,40,313,94,45,47,108,221,270,119,248,270,45,23)

  ## Data in radians then to "circular format"
  psirad <- psideg*2*pi/360
  thetarad <- thetadeg*2*pi/360
  cpsirad <- circular(psirad)
  cthetarad <- circular(thetarad)
  cdat <- data.frame(cpsirad, cthetarad)



  ###### reactive brush plot ########
  # For storing which rows have been excluded
  vals <- reactiveValues(
    keeprows = rep(TRUE, nrow(cdat)))

  output$k <- renderPlot({
    # Plot the kept and excluded points as two separate data sets
    keep    <- cdat[ vals$keeprows, , drop = FALSE]
    exclude <- cdat[!vals$keeprows, , drop = FALSE]

    ## Fits circular model specifically for 'keeprows' of selected data
    k_circlm <- lm.circular(type = "c-c", y = keep$cthetarad, x = keep$cpsirad, order = 1)

    k_circlm

    ggplot(keep, aes(cthetarad, cpsirad)) + 
      geom_point(aes(cthetarad, cpsirad, colour = keep$Vmag, size = 5))+
      scale_colour_gradient(low ="blue", high = "red")+
      geom_smooth(method = lm, fullrange = TRUE, color = "black") +
      geom_point(data = exclude, shape = 13, size = 5, fill = NA, color = "black", alpha = 0.25) +
      annotate("text", x = min(keep$cthetarad), y = Inf, hjust = .1, vjust = 1, 
               label = paste0("p value 1 = ", round(k_circlm$p.values[1], 2)), size = 7)+
      annotate("text", x = min(keep$cthetarad), y = Inf, hjust = .1, vjust = 2.5, 
               label = paste0("p value 2 = ", round(k_circlm$p.values[2], 2)), size = 7)+
      annotate("text", x = min(keep$cthetarad), y = Inf, hjust = .1, vjust = 4, 
               label = paste0("rho = ", round(k_circlm$rho, 2)), size = 7)+
      xlab("Lighthouse Direction (radians)")+ ylab("ADCP site direction (radians)")+
      theme(axis.title.x = element_text(size = 20), axis.title.y = element_text(size = 20))
  })

  # Toggle points that are clicked
  observeEvent(input$k_click, {
    res <- nearPoints(cdat, input$k_click, allRows = TRUE)

    vals$keeprows <- xor(vals$keeprows, res$selected_)})

  # Toggle points that are brushed, when button is clicked
  observeEvent(input$exclude_toggle, {
    res <- brushedPoints(cdat, input$k_brush, allRows = TRUE)

    vals$keeprows <- xor(vals$keeprows, res$selected_)})

  # Reset all points
  observeEvent(input$exclude_reset, {
    vals$keeprows <- rep(TRUE, nrow(cdat))})

  output$s <- renderPlot({

    # Create Summary table
    summarytable <- data.frame(matrix(ncol = 4, nrow = nrow(cdat)))
    colnames(summarytable) <- c(  "Psi_dir", "Theta_dir", "Fitted_values", "Residuals")

    # Un-comment lines below to read from non-reactive data for working summary table
    #summarytable$Psi_dir <- round(cdat$cpsirad, 2)
    #summarytable$Theta_dir <- round(cdat$cthetarad, 2)

    # attempting to pull from circlm within render plot
    # comment out for summarytable to work
    summarytable$Psi_dir <- round(keep$cpsirad, 2)
    summarytable$Theta_dir <- round(keep$cthetarad, 2)
    summarytable$Fitted_values <- round(k_circ.lm$fitted)
    summarytable$Residuals <- round(k_circ.lm$residuals)

    # outputing table with minimal formatting 
    summarytable <-na.omit(summarytable)
    t <- tableGrob(summarytable)
    Q <- grid.arrange(t, nrow = 1)
    Q

    }
  )
}

shinyApp(ui = ui, server = server)

r ggplot2 shiny non-linear-regression shinyapps
1个回答
0
投票

[这里有一些想法-但是有多种方法可以解决此问题,在进一步处理之后,您可能希望对server函数进行更多的重组。

[首先,您可能想要一个reactive表达式,该表达式将根据vals$keeprows更新您的模型,因为点击次数会发生变化。然后,您可以从绘图和数据表中通过此表达式访问模型结果。

这里是一个例子:

  fit_model <- reactive({
    ## Keep and exclude based on reactive value keeprows
    keep = cdat[ vals$keeprows, , drop = FALSE]
    exclude = cdat[!vals$keeprows, , drop = FALSE]

    ## Fits circular model specifically for 'keeprows' of selected data
    k_circlm <- lm.circular(type = "c-c", y = keep$cthetarad, x = keep$cpsirad, order = 1)

    ## Returns list of items including what to keep, exclude, and model
    list(k_circlm = k_circlm, keep = keep, exclude = exclude)
  })

它将返回list,您可以从绘图中访问它:

  output$k <- renderPlot({

    exclude <- fit_model()[["exclude"]]
    keep <- fit_model()[["keep"]]
    k_circlm <- fit_model()[["k_circlm"]]

    ggplot(keep, aes(cthetarad, cpsirad)) + 
    ...

并且可以从您的表中访问相同的内容(尽管您具有renderPlot吗?):

  output$s <- renderPlot({
    keep = fit_model()[["keep"]]
    k_circ.lm <- fit_model()[["k_circlm"]]

    # Create Summary table
    summarytable <- data.frame(matrix(ncol = 4, nrow = nrow(keep)))
    ...

注意,由于表的长度随着行的变化而变化,除非我误解,否则您可能想像上面一样使用nrow(keep)而不是nrow(cdat)

我还加载了gridExtra库以对此进行测试。

我怀疑您还可以考虑其他许多改进,但是认为这可以帮助您首先达到功能状态。

© www.soinside.com 2019 - 2024. All rights reserved.