7

我发现了一个有趣的包rpivotTable。我想创建shiny app其中包括rpivotTable使用downloadHandler.

但是,我无法找到解决方案、如何创建data.frame或其他我能够传递给downloadHandler函数的东西。

rpivotTable创建一个类对象:

class(pivot)
[1] "rpivotTable" "htmlwidget" 

threne 是否有可能下载此函数的输出?

另外,我附上了示例,如何在闪亮中创建枢轴以及我想使用的下载功能示例。

也许还有其他想法或建议?

set.seed(1992)
n=99
Year <- sample(2013:2015, n, replace = TRUE, prob = NULL)
Month <- sample(1:12, n, replace = TRUE, prob = NULL)
Category <- sample(c("Car", "Bus", "Bike"), n, replace = TRUE, prob = NULL)
Brand <- sample("Brand", n, replace = TRUE, prob = NULL)
Brand <- paste0(Brand, sample(1:14, n, replace = TRUE, prob = NULL))
USD <- abs(rnorm(n))*100

df <- data.frame(Year, Month, Category, Brand, USD)



output$Pivot <- rpivotTable::renderRpivotTable({
 rpivotTable(data = df, rows = "Brand", col = "Category", vals = "USD", aggregatorName = "Sum", rendererName = "Table")
})



  output$downloadData <- downloadHandler(
   filename = function() { paste(filename, '.csv', sep='') },
   content = function(file) {
   write.csv(PivotOutput, file)
})
4

3 回答 3

5

我刚刚在 github 上的 rpivotTable 主分支上推送了一项更改,该更改解决了获取用户在服务器端查看的参数的问题。

下载rpivotTable代码devtools

devtools::install_github("smartinsightsfromdata/rpivotTable",ref="master")

这是一个如何在服务器端获取所选数据的示例。该示例无法满足您的需求:您需要使用从 rpivotTable 返回的内容对原始数据框进行子集化。但这应该足以让您领先一步。

library(rpivotTable)
library(shiny)

list_to_string <- function(obj, listname) {
  if (is.null(names(obj))) {
    paste(listname, "[[", seq_along(obj), "]] = ", obj,
          sep = "", collapse = "\n")
  } else {
    paste(listname, "$", names(obj), " = ", obj,
          sep = "", collapse = "\n")
  }
}

server <- function(input, output) {

output$pivotRefresh <- renderText({

cnames <- list("cols","rows","vals", "exclusions","aggregatorName", "rendererName")
# Apply a function to all keys, to get corresponding values
allvalues <- lapply(cnames, function(name) {
  item <- input$myPivotData[[name]]
  if (is.list(item)) {
    list_to_string(item, name)
  } else {
    paste(name, item, sep=" = ")
  }
})
paste(allvalues, collapse = "\n")
})

output$mypivot = renderRpivotTable({
    rpivotTable(data=cars, onRefresh=htmlwidgets::JS("function(config) { Shiny.onInputChange('myPivotData', config); }"))
  })
}

ui <- shinyUI(fluidPage(
  fluidRow(column(6,   verbatimTextOutput("pivotRefresh")),
           column(6, rpivotTableOutput("mypivot") ))
)
)

shinyApp(ui = ui, server = server) 
于 2015-10-26T17:48:44.037 回答
2

为了扩展 Enzo 的出色答案(感谢您提供了很棒的软件包),我模拟了以下内容作为获取汇总数据并在闪亮的内部使用它的方法。

这使用onRefresh来监视配置中的更改,然后使用 DOM 获取相关元素的 innerHTML。在这种情况下,然后用于rvest清理该 html 并提取表,最后,出于演示目的,将其显示在DT::datatable.

这可能太 hacky,但它可以直接下载为 CSV,或者传递给其他闪亮的元素进行进一步处理。

用户界面

library(shiny)
library(DT)
library(rpivotTable)

FullPage <- fluidPage(
    DT::dataTableOutput('aSummaryTable'),
    rpivotTableOutput('RESULTS')
)

FullPage

服务器.R:

library(shiny)
library(rpivotTable)
library(DT)
library(rvest)

function(input, output, session) {

  # Make some sample data
  qbdata <- reactive({
    expand.grid(LETTERS,1:3)
  })

  # Clean the html and store as reactive
  summarydf <- eventReactive(input$myData,{
    input$myData %>% 
       read_html %>% 
       html_table(fill = TRUE) %>% 
       # Turns out there are two tables in an rpivotTable, we want the second
       .[[2]]

  })

  # show df as DT::datatable
  output$aSummaryTable <- DT::renderDataTable({
      datatable(summarydf(), rownames = FALSE)
  })

  # Whenever the config is refreshed, call back with the content of the table
  output$RESULTS <- renderRpivotTable({
    rpivotTable(
      qbdata(),
      onRefresh = 
        htmlwidgets::JS("function(config) { 
                           Shiny.onInputChange('myData', document.getElementById('RESULTS').innerHTML); 
                        }")
    )
  })

}
于 2016-09-06T02:45:07.440 回答
0

一个 github 存储库rpivotTabletocsv我尝试从 Rshiny App 的下载按钮实现 rpivotTable 到 csv 的导出。

于 2019-04-19T14:38:18.570 回答