Error : cannot coerce type 'environment' to vector of type 'character'

Error : cannot coerce type 'environment' to vector of type 'character'

我正在用 R 开发一个 Shiny 应用程序来预测输入文本的下一个单词。每次我 运行 我收到这个错误的应用程序

正在收听 http://127.0.0.1:5714 警告:as.character 中的错误:无法将类型 'environment' 强制转换为

的向量

输入'character'

堆栈跟踪(从最里面开始): 1: 运行应用程序

错误:无法将类型 'environment' 强制转换为类型 'character'

的向量

我已经尝试了所有我似乎无法理解的问题

    suppressWarnings(library(shiny))

    shinyUI(fluidPage(

    # Application title
    navbarPage("Coursera Word Predection Final Project",
         tabPanel("Home"),
         navbarMenu("Method",
                    tabPanel("Description", p("This app uses a ngram backoff 
    model to predict the next word in a sentence."))
                    )),

    # Sidebar layout
    sidebarLayout(

    sidebarPanel(
    textInput("sentence", "Continue the sentence here below", value = "this 
    is a result of the"),
   sliderInput("obs", "maximum predictions:",
              min = 0, max = 30, value = 10
   )

   ),

  mainPanel(
  h4("Sentence"),
  verbatimTextOutput("text"),

  h4("Prediction"),
  verbatimTextOutput("prediction")
  )
  )
  )
  )


 pred_words <- function(sentence, n = 10){
 sentence <- removeNumbers(sentence)
 sentence <- removePunctuation(sentence)
 sentence <- tolower(sentence)
 words <- unlist(strsplit(sentence, split = " " ))
 words <- tail(words, 5)
 word1 <- words[1];word2 <- words[2];word3 <- words[3];word4 <- 
 words[4];word5 <- words[5];
 datasub <- data.table()
 if (nrow(datasub)==0 & !is.na(word5)) {
  if(nrow(datasub) == 0) datasub <- subset(ngram6, w1==word1 & w2==word2 & 
  w3==word3 & w4==word4 & w5==word5)
  if(nrow(datasub) == 0) datasub <- subset(ngram5, w1==word2 & w2==word3 & 
  w3==word4 & w4==word5)
  if(nrow(datasub) == 0) datasub <- subset(ngram4, w1==word3 & w2==word4 & 
  w3==word5)
  if(nrow(datasub) == 0) datasub <- subset(ngram3, w1==word4 & w2==word5)
  if(nrow(datasub) == 0) datasub <- subset(ngram2, w1==word5)
   }

  if (nrow(datasub)==0 & !is.na(word4)) {
  if(nrow(datasub) == 0) datasub <- subset(ngram5, w1==word1 & w2==word2 & 
  w3==word3 & w4==word4)
  if(nrow(datasub) == 0) datasub <- subset(ngram4, w1==word2 & w2==word3 & 
  w3==word4)
  if(nrow(datasub) == 0) datasub <- subset(ngram3, w1==word3 & w2==word4)
  if(nrow(datasub) == 0) datasub <- subset(ngram2, w1==word4)
  }

  if (nrow(datasub)==0 & !is.na(word3)) {
  if(nrow(datasub) == 0) datasub <- subset(ngram4, w1==word1 & w2==word2 & 
  w3==word3)
  if(nrow(datasub) == 0) datasub <- subset(ngram3, w1==word2 & w2==word3)
  if(nrow(datasub) == 0) datasub <- subset(ngram2, w1==word3)
  }

  if (nrow(datasub)==0 & !is.na(word2)) {
  if(nrow(datasub) == 0) datasub <- subset(ngram3, w1==word1 & w2==word2)
  if(nrow(datasub) == 0) datasub <- subset(ngram2, w1==word2)
  }

  if (nrow(datasub)==0 & !is.na(word1)) {
  if(nrow(datasub) == 0) datasub <- subset(ngram2, w1==word1)
  if(nrow(datasub) == 0) datasub <- head(ngram1)
  }

  if(nrow(datasub) > 0){
  }

  }


  # Define server logic for the Word Prediction application
  shinyServer(function(input, output) {
reactive({
  pred_words(input$sentence, input$obs);
})
output$prediction <- renderPrint({
  ds <- data_prediction()
  if(nrow(ds)>0) {
    head(subset(ds, freq==max(ds$freq))[,ncol(ds)-1],3)
    cat( 
      paste( head(ds[,ncol(ds)-1]), collapse=', ' )
    )  
  }
})
})

 # Run the application 
 shinyApp(ui = shinyUI, server = shinyServer)

shinyUIshinyServer 是来自 Shiny 的函数。您想将实际的 ui 和服务器函数传递给 shinyApp(),例如:

library(shiny)

ui <- fluidPage(

)

server <- function(input, output) {

}

shinyApp(ui = ui, server = server)

错误:无法将类型 'environment' 强制转换为 'character' 类型的向量,这在我们使用 observe() 而不是响应式内部服务器函数时最常见