在 R 中对反应数据帧进行子集 [英] Subset a reactive dataframe in R

查看:28
本文介绍了在 R 中对反应数据帧进行子集的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

你好,我想找到我的数据集两列的相关系数.如果我使用 cor(subset(iris, select=c("Sepal.Length")),subset(iris, select=c("Sepal.Width")))

Hello I want to find the correlation coefficient of two columns of my dataset. If I use cor(subset(iris, select=c("Sepal.Length")),subset(iris, select=c("Sepal.Width")))

正在找到相关性,但我无法使用我的实际数据集进行子集化,该数据集作为 CSV 文件输入并在反应式表达式中.

the correlation is being found but I cannot subset with my actual dataset which comes as a CSV file input and is in a reactive expression.

cor(subset(rt(), select=c("Sepal.Length")),subset(rt(), select=c("Sepal.Width")))`

那么我如何才能对这种反应形式的数据框进行子集化?

So how could I subset a data frame of this reactive form?

rt<-reactive({
    req(input$file1)

    csvdata <- read.csv(input$file1$datapath,
                        header = input$header
    )


    csvdata
  }) 

如果这可能有助于理解问题,我把我的整个代码放在一起.如果没有正确的 csv,它就无法工作,但如果您将 rt() 替换为 iris 数据集,它就可以工作.

I put my whole code if that may help understand the question.It cannot work without the proper csv but it works if you replace rt() with iris dataset.

#ui.r
library(shiny)
library(ggplot2)
library(plotly)
library(extrafont)

fluidPage(

  # App title ----
  titlePanel(div("CROSS CORRELATION",style = "color:blue")),

  # Sidebar layout with input and output definitions ----
  sidebarLayout(

    # Sidebar panel for inputs ----
    sidebarPanel(

      # Input: Select a file ----
      fileInput("file1", "Input CSV-File",
                multiple = TRUE,
                accept = c("text/csv",
                           "text/comma-separated-values,text/plain",
                           ".csv")),

      # Horizontal line ----
      tags$hr(),

      # Input: Checkbox if file has header ----
      checkboxInput("header", "Header", TRUE),

      # Input: Select separator ----
      radioButtons("sep", "Separator",
                   choices = c(Comma = ",",
                               Semicolon = ";",
                               Tab = "\t"),
                   selected = ","),


      # Horizontal line ----
      tags$hr(),

      # Input: Select number of rows to display ----
      radioButtons("disp", "Display",
                   choices = c(Head = "head",
                               All = "all"),
                   selected = "head")





    ),
    # Main panel for displaying outputs ----
    mainPanel(

      tabsetPanel(type = "tabs",
                  tabPanel("Table",
                           shiny::dataTableOutput("contents")),
                  tabPanel("Correlation Plot",
                           fluidRow(
                             column(3, uiOutput("lx1")),
                           column(3,uiOutput("lx2"))),
                           hr(),
                           fluidRow(
                             tags$style(type="text/css",
                                        ".shiny-output-error { visibility: hidden; }",
                                        ".shiny-output-error:before { visibility: hidden; }"
                             ),
                           column(3,uiOutput("td")),
                           column(3,uiOutput("an"))),
                           plotlyOutput("sc"))
      ))
  ))
#server.r
function(input, output) {
  rt<-reactive({
    req(input$file1)

    csvdata <- read.csv(input$file1$datapath,
                        header = input$header
    )


    csvdata
  }) 

  output$contents <- shiny::renderDataTable({

    rt()
  })


  output$lx1<-renderUI({
    selectInput("lx1", label = h4("Select 1st Expression Profile"), 
                choices = colnames(rt()[,4:15]), 
                selected = "Lex1")
  })
  output$lx2<-renderUI({
    selectInput("lx2", label = h4("Select 2nd Expression Profile"), 
                choices = colnames(rt()[,4:15]), 
                selected = "Lex2")
  })

  output$td<-renderUI({
    radioButtons("td", label = h3("Trendline"),
                 choices = list("Add Trendline" = "lm", "Remove Trendline" = ""), 
                 selected = "")
  })

  output$an<-renderUI({

    radioButtons("an", label = h3("Correlation Coefficient"),
                 choices = list("Add R^2" = cor(subset(rt(), select=c(input$lx1)),subset(rt(), select=c(input$lx2))), "Remove R^2" = ""), 
                 selected = "")
  })   


 output$sc<-renderPlotly({

   p1 <- ggplot(rt(), aes_string(x = input$lx1, y = input$lx2))+
     # Change the point options in geom_point
     geom_point(color = "darkblue") +
     # Change the title of the plot (can change axis titles
     # in this option as well and add subtitle)
     labs(title = "Cross Correlation") +
     # Change where the tick marks are
     scale_x_continuous(breaks = seq(0, 80000, 10000)) +
     scale_y_continuous(breaks = seq(0, 120000, 20000)) +
     # Change how the text looks for each element
     theme(title = element_text(family = "Calibri", 
                                size = 10, 
                                face = "bold"), 
           axis.title = element_text(family = "Calibri Light", 
                                     size = 16, 
                                     face = "bold", 
                                     color = "darkgrey"), 
           axis.text = element_text(family = "Calibri", 
                                    size = 11))+
     theme_bw()+
     geom_smooth(method = input$td)+
     annotate("text", x = 50000, y = 50000, label = as.character(input$an))
   ggplotly(p1) %>%
     layout(hoverlabel = list(bgcolor = "white", 
                              font = list(family = "Calibri", 
                                          size = 9, 
                                          color = "black")))

 }) 

}

推荐答案

有两种解决方法:

  1. reactiveValues 对象中存储数据帧(请参阅:针对非常相似的问题,使用闪亮的应用程序创建反应式数据框)
  2. 在调用 cor 或其他不能正常处理反应的函数之前,通过 rt.df <- rt() 将反应表达式强制转换为常规 R 变量.
  1. Store dataframes inside reactiveValues objects (see: Creating a reactive dataframe with shiny apps for quite similar issue)
  2. Coerce reactive expression to regular R variable via rt.df <- rt() before calling cor or other functions that don't handle reactives gracefuly.

这篇关于在 R 中对反应数据帧进行子集的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

查看全文
登录 关闭
扫码关注1秒登录
发送“验证码”获取 | 15天全站免登陆