在Shiny上显示预测模型的类概率

时间:2019-01-30 12:42:26

标签: r shiny shiny-server

我使用Caret训练了一个随机森林,现在使用Shiny App上载了一个.csv文件作为测试集,以查看该应用程序上载的测试集的类。现在,我需要在Shiny应用程序上绘制一个图以显示每个类的概率。代码:

library(caret)
library(shiny)
library(randomForest)
data("iris")
train_control <- trainControl(method="cv", number=3,savePredictions = 
TRUE,classProbs = TRUE)
model <- train(Species~., data=iris, trControl=train_control, method="nb")
ui=fluidPage(
titlePanel("Prediction Result"),
sidebarLayout(
sidebarPanel(
fileInput('datafile', 'Choose CSV File',accept=c('text/csv','text/comma- 
separated-values,text/plain','.csv')),
     tags$hr(),
     checkboxInput('header', 'Header', TRUE),
     radioButtons('sep', 'Separator',
                  c(Comma=',',
                    Semicolon=';',
                    Tab='\t'),
                  ','),
    radioButtons('quote', 'Quote',
                  c(None='',
                    'Double Quote'='"',
                    'Single Quote'="'"),
                  '"')
 ),
  mainPanel(
     tableOutput("table1"),plotOutput("plot")
  )
  )
  )

  server=function(input, output) {
  dInput = reactive({
 in.file = input$datafile

 if (is.null(in.file))
     return(NULL)
  bw <- read.csv(in.file$datapath, header=input$header, sep=input$sep, 
  quote=input$quote)
   })
  clusters <- reactive({
  df <- dInput()
  if (is.null(df))
  return(NULL)
  tt <- as.data.frame(predict(model,df))
  tt
   })
  output$table1 <- renderTable({
  toprint = clusters()
 head(toprint)
 output$plot<-renderPlot({ plot(predict(model,df,type="raw"))
 })

 })
 }
shinyApp(ui=ui,server=server)

但是我遇到以下错误:

 no applicable method for 'xtable' applied to an object of class "function"

我应该如何解决此错误? 集集可以是.csv格式的以下数据框:

 structure(list(Sepal.Length = 4L, Sepal.Width = 4L, Petal.Length = 1L, 
Petal.Width = 0.2, Species = structure(1L, .Label = "setosa", class = 
"factor")), class = "data.frame", row.names = c(NA, 
-1L))

1 个答案:

答案 0 :(得分:0)

希望这对您有所帮助

首先,您的代码在这里有些混乱:

 output$table1 <- renderTable({
  toprint = clusters()
 head(toprint)
 output$plot<-renderPlot({ plot(predict(model,df,type="raw"))
 })

 })

您将output $ plot嵌套在output $ table1内。正确的方法将是:

  output$table1 <- renderTable({
    toprint = clusters()
    head(toprint)
  })
    output$plot<-renderPlot({ plot(predict(model,df,type="raw"))


  })

第二,因为在生成df之前需要输入一些文件,所以在运行代码时该文件为空。

不要说您在最开始的df处将其分配为虹膜,那么您的代码将起作用:

library(caret)
library(shiny)
library(randomForest)
data("iris")
df <- NULL
train_control <- trainControl(method="cv", number=3,savePredictions = 
                                TRUE,classProbs = TRUE)
model <- train(Species~., data=iris, trControl=train_control, method="nb")
ui=fluidPage(
  titlePanel("Prediction Result"),
  sidebarLayout(
    sidebarPanel(
      fileInput('datafile', 'Choose CSV File',accept=c('text/csv','text/comma- 
                                                       separated-values,text/plain','.csv')),
      tags$hr(),
      checkboxInput('header', 'Header', TRUE),
      radioButtons('sep', 'Separator',
                   c(Comma=',',
                     Semicolon=';',
                     Tab='\t'),
                   ','),
      radioButtons('quote', 'Quote',
                   c(None='',
                     'Double Quote'='"',
                     'Single Quote'="'"),
                   '"')
      ),
    mainPanel(
      tableOutput("table1"),plotOutput("plot")
    )
  )
)

server=function(input, output) {
  dInput = reactive({
    in.file = input$datafile

    if (is.null(in.file))
      return(NULL)
    bw <- read.csv(in.file$datapath, header=input$header, sep=input$sep, 
                   quote=input$quote)
  })
  clusters <- reactive({
    df <- dInput()
    if (is.null(df))
      return(NULL)
    tt <- as.data.frame(predict(model,df))
    tt
  })
  output$table1 <- renderTable({
    toprint = clusters()
    head(toprint)
  })
  output$plot<-renderPlot({
    if (is.null(df))
      return(NULL)
    plot(predict(model,df,type="prob"))


  })
}
shinyApp(ui=ui,server=server)

当然,您需要弄清楚一开始的内容:什么都没有?默认数据集?

最好!