如何使这些shinyApp参数成为"反应性"输入更改

时间:2016-05-26 09:07:28

标签: r reactive-programming shiny

我构建了一个简单的有光泽的App,它绘制了一个正态分布,给出了两个分位数(lbv和ubv),对应于5%和95%的概率(90%置信区间)。分位数是用户定义的输入。

要获得普通PDF的均值和sd,请使用rriskDistributions包中的get.norm.par(),如下所示:

dpar <- get.norm.par(p=c(0.05,0.95),q=c(lbv,ubv),plot=F)
mean <- dpar[1]
sd <- dpar[2]

如何让shinyApp对UI中的输入更改做出反应?我是Shiny的新手 - 似乎我必须使用reactive()和刷新(?),但我无法理解在哪里/如何使用它。任何提示将不胜感激。

下面的代码生成了shinyApp,但它不是&#34;反应性&#34;改变用户定义的输入。

# Set libraries
library(shiny)
library(rriskDistributions)

# Global variables can go here
lb <- 0.05
ub <- 0.95
lbv <- 200
ubv <- 1000
dpar <- get.norm.par(p=c(lb,ub),q=c(lbv,ubv),plot=F)
mean <- dpar[1]
sd <- dpar[2]

x1 <- lbv - (ubv-lbv)/2 # set my x-axis left bound
x2 <- ubv + (ubv-lbv)/2 # set my x-axis right bound

xseq<-seq(x1,x2,.1)

densities<-dnorm(xseq, mean,sd)

ui <- fluidPage(
        titlePanel("Parameters"),
        sidebarLayout(
                sidebarPanel(
                        numericInput('lbv', 'Lower Bound Value', lbv),
                        numericInput('ubv', 'Upper Bound Value', ubv)

                ),
                mainPanel(
                        plotOutput('plot')
                )
        )
)

server <- function(input, output) {    
        output$plot <- renderPlot({
        plot(xseq, densities, col="darkgreen", xlab="", ylab="Density", type="l",lwd=2, cex=2, main="Normal Density", cex.axis=.8)
        })
}

shinyApp(ui = ui, server = server)

enter image description here

我已尝试根据示例here进行以下更改,我可以告诉它不会工作但不确定要做出哪些更改....

 sidebarPanel(
                      numericInput('lbv', 'Lower Bound Value', lbv),
                      numericInput('ubv', 'Upper Bound Value', ubv),
                      actionButton(inputId = "refresh", label = "Refresh" , 
                                      icon = icon("fa fa-refresh"))

dataInput <- reactive({
    get.norm.par(p=c(lb,ub),q=c(input$lbv,input$ubv),plot=F)
    mean <- get.norm.par(p=c(lb,ub),q=c(input$lbv,input$ubv),plot=F)[1]
    sd <- get.norm.par(p=c(lb,ub),q=c(input$lbv,input$ubv),plot=F)[2]

    x1 <- input$lbv - (input$ubv-input$lbv)/2 # set my x-axis left bound
    x2 <- input$ubv + (input$ubv-input$lbv)/2 # set my x-axis right bound

    xseq<-seq(x1,x2,.1)

    densities<-dnorm(xseq, mean,sd)
})

1 个答案:

答案 0 :(得分:1)

我们需要制作依赖input$反应的对象,见下文:

# Set libraries
library(shiny)
library(rriskDistributions)

# Global variables can go here
lb <- 0.05
ub <- 0.95


ui <- fluidPage(
  titlePanel("Parameters"),
  sidebarLayout(
    sidebarPanel(
      numericInput('lbv', 'Lower Bound Value', 200),
      numericInput('ubv', 'Upper Bound Value', 1000)
    ),
    mainPanel(
      plotOutput('plot')
    )
  )
)

server <- function(input, output) {    

  xseq <- reactive({
    x1 <- input$lbv - (input$ubv - input$lbv)/2 # set my x-axis left bound
    x2 <- input$ubv + (input$ubv - input$lbv)/2 # set my x-axis right bound
    # return
    seq(x1, x2, 0.1)
  })

  densities <- reactive({
    dpar <- get.norm.par(p = c(lb, ub), q = c(input$lbv, input$ubv), plot = FALSE)
    mean <- dpar[1]
    sd <- dpar[2]
    # return
    dnorm(xseq(), mean, sd)
  })

  output$plot <- renderPlot({
    plot(xseq(), densities(),
         col = "darkgreen", xlab="", ylab="Density", type="l",lwd=2, cex=2,
         main="Normal Density", cex.axis=.8)
  })
}

shinyApp(ui = ui, server = server)