【问题标题】:Pass a parameter to reactive function将参数传递给反应函数
【发布时间】:2025-12-21 10:35:07
【问题描述】:

我的问题如下,我怀疑它有一个简单的解决方案。但是我查看了create reactive function from user inputReactive Function Parameter,它们都没有回答我的问题。

我有一个图表,它的 X 轴和 Y 轴可能会根据用户输入而改变。用户将能够单击图表,我有一个文本显示,上面写着“您选择了 xxx 的(x 标签名称)值和 yyy 的(y 标签名称)值'。显然,如果 x 或 y 标签的名称以元音开头,我想使用 'an' 而不是 'a'。目前我已经在服务器模块中写了两次这个函数,但这不是很优雅。

有没有办法在服务器函数中定义一个函数,我可以将标签名称发送到该函数,并且只返回“a”或“an”?代码如下。请注意,口袋妖怪数据集与 highcharter 包一起传输,可以从 CRAN 下载。

library(ggplot2)
library(highcharter)

myData <- pokemon

ui <- fluidPage(
  # Some custom CSS for a smaller font for preformatted text
  tags$head(
    tags$style(HTML("
                    pre, table.table {
                    font-size: smaller;
                    }
                    "))
    ),
  tags$head(tags$style(type = "text/css", ".shiny-text-output, .well{background-color: #EFF8CD;}")),

  fluidRow(
    column(width = 3
           ),
    column(width = 5,
           plotOutput("plot1", height = 450,
                      # Equivalent to: click = clickOpts(id = "plot_click")
                      click = "plot_click"
           )
    ),
    column(width = 4,
           ## Text output here.
             wellPanel(
               h4("Your results"),
               htmlOutput("chartDetails")
             )
           )
  )
)


server <- function(input, output) {
  output$plot1 <- renderPlot({
      ggplot(myData, aes(weight, attack)) + geom_point()
    }
  )

  ## Extract some values when plot is clicked
  inputX <- reactive({
    if (is.null(input$plot_click$x))
        {
          -999
          }
    else
      {
        round(input$plot_click$x, 0)
      }
    })
  inputY <- reactive({
    if (is.null(input$plot_click$y))
    {
    -999
    }
    else
    {
     round(input$plot_click$y, 0) 
    }
  })

  labelX <- eventReactive(input$plot_click, {
    input$plot_click$mapping$x
  })
  labelY <- eventReactive(input$plot_click,{
    input$plot_click$mapping$y
  })

  ## count the number of points that have a higher x and y.
  mySubset <- eventReactive(input$plot_click, {
    #myFirstSubset <- subset(myData, weight > inputX())
    subset(myData, labelX() > inputX() & labelY() > inputY())
    })


  ## Create relevant strings out of the inputX and inputY values.
  stringX <- reactive({
    if (inputX() > -999)
    {
      myString <- "You have selected"
      if (substr(labelX(), 1,1) %in% c("a", "e", "i", "o", "u"))
      {
        myString <- paste(myString, "an")
      }
      else
      {
        myString <- paste(myString, "a")
      }
      paste(myString, labelX(), "of", inputX())
    }
    else
    {
      ""
    }
  })

  stringY <- reactive({
    if (inputY() > -999)
    {
      myString <- "and"
      if (substr(labelY(), 1,1) %in% c("a", "e", "i", "o", "u"))
      {
        myString <- paste(myString, "an")
      }
      else
      {
        myString <- paste(myString, "a")
      }
      paste(myString, labelY(), "of", inputY())
    }
    else
    {
      ""
    }
  })

  stringCount <- reactive({
    if (inputY() > -999 && inputX() > -999)
    {
      paste("The number of records with higher",labelX(), "and", labelY(), "is", nrow(mySubset()))
    }
    else
    {
      ""
    }
  })

  ## Post the results to the chart details well.
  output$chartDetails <- renderUI({
    if (inputX() > -999 && inputY() > -999) {

    HTML(paste(stringX(), "<br>",
               stringY(), "<br>",
               stringCount()))
    }
    else
    {
      HTML("Click on the chart")
    }

  })

}

    shinyApp(ui, server)

【问题讨论】:

  • 您可以定义一个“普通”函数来检查第一个字符并在 ui 和服务器之外或在 global.R 中返回“a”或“an”。
  • 谢谢。老实说,我今天没有看到树木的木材。我会发布一个有效的答案。

标签: r ggplot2 shiny r-highcharter


【解决方案1】:

Dieter Menne 建议的简单解决方案如下:

在 UI/服务器功能之外:

myConnective <- function(aString) {
  if (substr(aString, 1,1) %in% c("a", "e", "i", "o", "u"))
  {
    myString <- "an"
  }
  else
  {
    myString <- "a"
  }
  return(myString)
}

然后在Server函数里面:

stringX <- reactive({
    if (inputX() > -999)
    {
      paste("You have selected", myConnective(labelX()), labelX(), "of", inputX() )
    }
    else
    {
      ""
    }
  })

【讨论】:

    【解决方案2】:

    我不知道这是否是你想要的,但你可以用这两个函数代替元音函数

    vowel <- function(myString, label){
        if (substr(label, 1,1) %in% c("a", "e", "i", "o", "u"))
       {
         myString <- paste(myString, "an")
       }
       else
       {
         myString <- paste(myString, "a")
       }
       return(myString)
     }
    
     ## Create relevant strings out of the inputX and inputY values.
     stringX <- reactive({
       if (inputX() > -999)
       {
         myString <- "You have selected"
    
         paste(vowel(myString,labelX()), labelX(), "of", inputX())
       }
       else
       {
         ""
       }
     })
    
     stringY <- reactive({
       if (inputY() > -999)
       {
         myString <- "and"
    
         paste(vowel(myString,labelY()), labelY(), "of", inputY())
       }
       else
       {
         ""
       }
     })
    

    【讨论】: