Показать класс вероятностей модели прогнозирования на Shiny - PullRequest
0 голосов
/ 30 января 2019

Я обучил Случайный Лес с помощью 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 голосов
/ 30 января 2019

Надеюсь, это вам поможет:

Во-первых, ваш код несколько запутан здесь:

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

 })

Вы вложили вывод $ plot в вывод $ table1.Правильный путь будет:

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


  })

Во-вторых, потому что вам нужно ввести некоторые файлы перед генерацией df, когда вы запускаете код, он пуст.

Если вы не назначите в самом начале df значение iris, тогда ваш код будет работать:

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)

Конечно, вам нужно выяснить, что вы показываете в самом начале:ничего такого?набор данных по умолчанию?

Best!

Добро пожаловать на сайт PullRequest, где вы можете задавать вопросы и получать ответы от других членов сообщества.
...