блестящий, чтобы загрузить данные и исследовать сбои - PullRequest
0 голосов
/ 18 апреля 2020

Я хочу загрузить в файл CSV / TXT с идентификатором, временем, концентрацией и графиком (время (ось X) против con c (ось Y). Мое приложение запускается и падает, когда я пытаюсь принести Функция updateselctinput вне reactive блестящее приложение не запускается.

Может кто-нибудь сказать мне, почему это происходит?

Я вставил свой код ниже:

library(shiny)
library(shinydashboard)
ui <- dashboardPage(
  dashboardHeader(title="Dashboard"),
  dashboardSidebar(
    sidebarMenu(
    menuItem("Input Data", tabName = "dashboard", icon = icon("dashboard")))),
dashboardBody(
  tabItems(
    tabItem(tabName = "dashboard",
            tabPanel("Input Route",
                     # First tab content
                     fileInput("df", "Choose text/csv File",
                               multiple = FALSE,
                               accept = c("text/csv"))),
            tags$br(),
            checkboxInput('header', 'Header', TRUE),
            radioButtons('sep', 'Separator',
                         c(Comma=',',
                           Semicolon=';',
                           Tab='\t'),
                         ','),
            radioButtons('quote', 'Quote',
                         c(None='',
                           'Double Quote'='"',
                           'Single Quote'="'"),
                         '"'),
            tabPanel("First Type",
                         # "Empty inputs" - they will be updated after the data is uploaded
                         selectInput('xcol', 'X Variable', ""),
                         selectInput('ycol', 'Y Variable', "", selected = ""),
                          selectInput('ide','Group',"",selected="")

                       ))),
  fluidRow(
    box(plotOutput("Plot1"),height = 250)
)
))

server <- function(input, output,session) {
  data <- reactive({ 
    inFile <- input$df 
    df <- read.csv(inFile$datapath, header = input$header)
    return(df)
  })
  observe({
    df1 = data()
      updateSelectInput(session,inputId = 'xcol', label = 'X Variable',
                        choices = names(df1), selected =names(df1)[2])
      updateSelectInput(session,inputId = 'ycol', label = 'Y Variable',
                        choices = names(df1), selected = names(df1)[2])})
  ### Plot
  output$Plot1<-renderPlot({plot(Plot1<-data()%>%ggplot()+
                                   geom_line(aes(x=input$xcol,y=input$ycol))+
                                   theme_bw())})
}

shinyApp(ui, server)

Ответы [ 2 ]

0 голосов
/ 18 апреля 2020

Как насчет этого?

library(shiny)
library(datasets)

ui <- shinyUI(fluidPage(
  titlePanel("Column Plot"),
  tabsetPanel(
    tabPanel("Upload File",
             titlePanel("Uploading Files"),
             sidebarLayout(
               sidebarPanel(
                 fileInput('file1', 'Choose CSV File',
                           accept=c('text/csv', 
                                    'text/comma-separated-values,text/plain', 
                                    '.csv')),

                 # added interface for uploading data from
                 # http://shiny.rstudio.com/gallery/file-upload.html
                 tags$br(),
                 checkboxInput('header', 'Header', TRUE),
                 radioButtons('sep', 'Separator',
                              c(Comma=',',
                                Semicolon=';',
                                Tab='\t'),
                              ','),
                 radioButtons('quote', 'Quote',
                              c(None='',
                                'Double Quote'='"',
                                'Single Quote'="'"),
                              '"')

               ),
               mainPanel(
                 tableOutput('contents')
               )
             )
    ),
    tabPanel("First Type",
             pageWithSidebar(
               headerPanel('My First Plot'),
               sidebarPanel(

                 # "Empty inputs" - they will be updated after the data is uploaded
                 selectInput('xcol', 'X Variable', ""),
                 selectInput('ycol', 'Y Variable', "", selected = "")

               ),
               mainPanel(
                 plotOutput('MyPlot')
               )
             )
    )

  )
)
)

server <- shinyServer(function(input, output, session) {
    # added "session" because updateSelectInput requires it


  data <- reactive({ 
    req(input$file1) ## ?req #  require that the input is available

    inFile <- input$file1 

    # tested with a following dataset: write.csv(mtcars, "mtcars.csv")
    # and                              write.csv(iris, "iris.csv")
    df <- read.csv(inFile$datapath, header = input$header, sep = input$sep,
             quote = input$quote)


    # Update inputs (you could create an observer with both updateSel...)
    # You can also constraint your choices. If you wanted select only numeric
    # variables you could set "choices = sapply(df, is.numeric)"
    # It depends on what do you want to do later on.

    updateSelectInput(session, inputId = 'xcol', label = 'X Variable',
                      choices = names(df), selected = names(df))
    updateSelectInput(session, inputId = 'ycol', label = 'Y Variable',
                      choices = names(df), selected = names(df)[2])

    return(df)
  })

  output$contents <- renderTable({
      data()
  })

  output$MyPlot <- renderPlot({
    # for a histogram: remove the second variable (it has to be numeric as well):
    # x    <- data()[, c(input$xcol, input$ycol)]
    # bins <- nrow(data())
    # hist(x, breaks = bins, col = 'darkgray', border = 'white')

    # Correct way:
    # x    <- data()[, input$xcol]
    # bins <- nrow(data())
    # hist(x, breaks = bins, col = 'darkgray', border = 'white')


    # I Since you have two inputs I decided to make a scatterplot
    x <- data()[, c(input$xcol, input$ycol)]
    plot(x)

  })
})

shinyApp(ui, server)

enter image description here

enter image description here

Проверить ссылку ниже приведены несколько дополнительных идей о том, как с этим справиться.

https://shiny.rstudio.com/gallery/

0 голосов
/ 18 апреля 2020

app.R

library(shiny)
library(shinydashboard)
ui <- dashboardPage(
  dashboardHeader(title="Dashboard"),
  dashboardSidebar(
    sidebarMenu(
    menuItem("Input Data", tabName = "dashboard", icon = icon("dashboard")))),
dashboardBody(
  tabItems(
    tabItem(tabName = "dashboard",
            tabPanel("Input Route",
                     # First tab content
                     fileInput("df", "Choose text/csv File",
                               multiple = FALSE,
                               accept = c("text/csv"))),
            tags$br(),
            checkboxInput('header', 'Header', TRUE),
            radioButtons('sep', 'Separator',
                         c(Comma=',',
                           Semicolon=';',
                           Tab='\t'),
                         ','),
            radioButtons('quote', 'Quote',
                         c(None='',
                           'Double Quote'='"',
                           'Single Quote'="'"),
                         '"'),
            tabPanel("First Type",
                         selectInput('xcol', 'X Variable', ""),
                         selectInput('ycol', 'Y Variable', "", selected = ""),
                          selectInput('ide','Group',"",selected="")

                       ))),
  # Boxes need to be put in a row (or column)
  fluidRow(
    box(plotOutput("Plot1"),height = 250)
)
))
server <- function(input, output,session) {
  data <- reactive({ 
   shiny::req(input$df)
    inFile <- (input$df)
    df <- read.csv(inFile$datapath, header = input$header)
    return(df)
  })
  observe({
    df1 = data()
      updateSelectInput(session,inputId = 'xcol', label = 'X Variable',
                        choices = names(df1), selected =names(df1)[2])
      updateSelectInput(session,inputId = 'ycol', label = 'Y Variable',
                        choices = names(df1), selected = names(df1)[2])})
  output$Plot1<-renderPlot({plot(Plot1<-data()%>%ggplot()+
                                   geom_line(aes_string(x=input$xcol,y=input$ycol))+
                                   theme_bw())})
}
shinyApp(ui, server)

...