从data.frame删除行(R闪亮)

时间:2019-02-12 13:12:53

标签: r shiny dt

我正在尝试编写一个闪亮的应用程序,该应用程序读取您的* .csv文件并根据该文件生成图。该文件的标题和底部包含几行,用户应该可以在闪亮的应用程序中删除这些行。因此,基本上,这个编辑的文件就是情节的来源。

我不确定如何根据输入文件创建电抗部分。尝试了此页面上的几种方法,但我无法使其正常工作。我附加了一个简化的Test.csv文件。

  if (!require("shiny")) install.packages("shiny", dependencies = TRUE) 
  if (!require("shinyjs")) install.packages("shinyjs", dependencies = TRUE) 
  if (!require("DT")) install.packages("DT", dependencies = TRUE)   

  library(shiny)
  library(shinyjs)
  library(DT)

  ui <- fluidPage(
    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')),
              tags$br(),
              checkboxInput('header', 'Header', FALSE),
              radioButtons('sep', 'Separator', c(Semicolon=';', Comma=',', Tab='\t'), ','),
                   radioButtons('quote', 'Quote',c(None='', 'Double Quote'='"', 'Single Quote'="'"), '"'),
                   actionButton('delete_row', 'Delete row')
              ),
             mainPanel(
                   DT::dataTableOutput('contents')
             )
          )
       ),

       tabPanel("Plot",
         pageWithSidebar(
            headerPanel('Visualisation'),
              sidebarPanel(
                selectInput('xcol', 'X Variable', ""),
                selectInput('ycol', 'Y Variable', "", selected = ""),
                textOutput("m_out")
              ),
              mainPanel(
                plotOutput('MyPlot')
              )
          )
       )
    )
  )

  server <- function(input, output, session) {

    data <- reactive({ 
      req(input$file1) 
      inFile <- input$file1 
      df <- read.csv(inFile$datapath, header = input$header, sep = input$sep, quote = input$quote)
      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)
    })

    ### This part is the problem
    ###
    observeEvent(input$delete_row, {
      if (!is.null(input$contents_rows_selected)) {
        #print(input$contents_rows_selected) #testing input
        data$values <- data$values[-nrow(input$contents_rows_selected),]

      }
    })
    ###
    ### End of problem

    output$contents = DT::renderDataTable({
      data()
    })

    output$MyPlot <- renderPlot({
      x <- data()[, c(input$xcol, input$ycol)]
      plot(x)
    })

  }

  ### End of server commands

  ### Start Shiny App
  shinyApp(ui = ui, server = server)

非常感谢您的帮助。问题标有###

1 个答案:

答案 0 :(得分:0)

尝试将您的数据变量设置为reactVal()。我建议您也将输入$ file1读入数据帧。 在服务器功能中:

  data <- reactiveVal(NULL)

并将其值设置为一个事件,观察提交输入文件的情况:

observeEvent(input$file1, {
  df <- read.csv(inFile$datapath, header = input$header, sep = input$sep, quote = input$quote)
      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])
      data(df)
})

然后删除该行将类似于:

...
df2 <- data()
df2 <- df2[-nrow(input$contents_rows_selected),]
data(df2)
...

这将允许您的其他UI函数在观察(活动)data()对象的更改时触发。