在 R Shiny 中操作 textInput

Posted

技术标签:

【中文标题】在 R Shiny 中操作 textInput【英文标题】:Manipulating textInput in R Shiny 【发布时间】:2018-01-18 02:07:38 【问题描述】:

我对 R 比较陌生,对 Shiny(字面意思是第一天)更加陌生。

我希望用户输入多个用逗号分隔的短语,例如 female, aged, diabetes mellitus. 我有一个数据框,其中一个变量 MH2 包含文本词。我想输出一个数据框,其中仅包含所有输入短语都存在的行。有时用户可能只输入一个短语,而其他时候 5 个。

这是我的 ui.R

library(shiny)
library(stringr)

# load dataset
load(file = "./data/all_cardiovascular_case_reports.Rdata")

ui <- fluidPage(
  sidebarLayout(
    sidebarPanel(
      textInput(inputId = "phrases", 
                label = "Please enter all the MeSH terms that you would like to search, each separated by a comma:",
                value = ""),

      helpText("Example: female, aged, diabetes mellitus")

    ),
    mainPanel(DT::dataTableOutput("dataframe"))
  )
)

这是我的服务器。R

library(shiny)

server <- function(input, output)

  # where all the code will go
    df <- reactive(

      # counts how many phrases there are
      num_phrases <- str_count(input$phrases, pattern = ", ") + 1

      a <- numeric(num_phrases) # initialize vector to hold all phrases

      # create vector of all entered phrases
      for (i in 1:num_phrases)
      
        a[i] <- noquote(strsplit(input$phrases, ", ")[[i]][1])
      

      # make all phrases lowercase
      a <- tolower(a)

      # do exact case match so that each phrase is bound by "\\b"
      a <- paste0("\\b", a, sep = "")
      exact <- "\\b"
      a <- paste0(a, exact, sep = "")

      # subset dataframe over and over again until all phrases used
      for (i in 1:num_phrases)
      
        final <- final[grepl(pattern = a, x = final$MH2, ignore.case = TRUE), ]
      

      return(final)
    )

    output$dataframe <- DT::renderDataTable(df())

当我尝试运行renderText(num_phrases) 时,我始终得到1,即使我会输入多个用逗号分隔的短语。从那时起,每当我尝试输入多个短语时,都会遇到“错误:下标越界”。但是,当我输入仅用逗号分隔的单词而不是逗号和空格(输入“女性,老年”而不是“女性,老年”)时,这个问题就消失了,但我的数据框没有正确子集。它只能子集一个短语。

请指教。

谢谢。

【问题讨论】:

【参考方案1】:

我认为您的 Shiny 逻辑看起来不错,但是用于子集数据框的函数有一些小问题。特别是:

a[i] &lt;- noquote(strsplit(input$phrases, ", ")[[i]][1])

索引[[i]]1在这里放错了位置,应该是[[1]][i]

final <- final[grepl(pattern = a, x = final$MH2, ignore.case = TRUE), ]

你不能像这样匹配多个模式,只会使用a的第一个元素,这也是R给出的警告。


示例工作代码

我在这里将input$phrases 更改为inp_phrases。如果此脚本执行您想要的操作,我认为您可以轻松地将其复制到您的响应式中,进行必要的更改(即更改 inp_phrases 并添加 return(result) 语句。)。如果您希望所有模式都在一行内匹配,或者返回所有行是否匹配任何模式,我也不完全清楚,所以我将它们都添加了,您可以取消注释您需要的:

library(stringr)

# some example data
inp_phrases = "ab, cd"
final = data.frame(index = c(1,2,3,4),MH2 = c("ab cd ef","ab ef","cd ef ab","ef gx"),stringsAsFactors = F)

# this could become just two lines:
a <- sapply(strsplit(inp_phrases, ", ")[[1]],  function(x) tolower(noquote(x)))
a <- paste0("\\b", a, "\\b") 

# Two options here, uncomment the one you need.
# Top one: match any pattern in a. Bottom: match all patterns in a
# indices = grepl(pattern = paste(a,collapse="|"), x = final$MH2, ignore.case = TRUE)
indices = colSums(do.call(rbind,lapply(a, function(x) grepl(pattern = x, x = final$MH2, ignore.case = TRUE))))==length(a)

result <- final[indices,]

返回:

  index      MH2
1     1 ab cd ef
3     3 cd ef ab

... 使用第二个版本的索引(匹配所有)或

  index      MH2
1     1 ab cd ef
2     2    ab ef
3     3 cd ef ab

...与第一个版本的索引(匹配任何)

希望这会有所帮助!

【讨论】:

非常感谢!是的,这正是我想要的。我使用了匹配所有短语的代码。再次感谢! 没问题,很高兴我能帮上忙!

以上是关于在 R Shiny 中操作 textInput的主要内容,如果未能解决你的问题,请参考以下文章

检索嵌入在 R Shiny 应用程序中的视频播放时间

R Shiny - 我无法从selectInput操作中检索选定的输出值

在 R Shiny 中使用 ActionButton 跳转到选项卡项

在 R Shiny 中,如何使用 actionButton 重置 rhandsontable 中的数据(反转所有手动输入)?

在 R Shiny 中,如何为反应对象渲染绘图?

R Shiny:在 ObserveEvent 中更新代理表列标题