0

在下面发布的示例中,我有一个 df ,其中包含 100 行和 100 列的数值(第一列除外),我想在 Shiny 的主面板上使用顺序色标打印。由于所有列都不适合单个窗口,因此我想在保持第一列固定的同时使用水平滚动。这是我的尝试。不知道我哪里出错了。如您所见,我使用的是 DT 包。如果有人也可以向我展示带有可反应包的解决方案,我将不胜感激。

library(shiny)
library(tidyverse)
df <- matrix(runif(100*100,0,1000) %>% floor(),nrow = 100,ncol = 100) %>% as_tibble() %>% 
    mutate(V1=rep_len(letters,length.out = 100))
# Define UI for application that draws a histogram
ui <- fluidPage(
    # Application title
    titlePanel("Table"),
    sidebarLayout(
        # Show the table
        sidebarPanel(),
        mainPanel(
           DT::DTOutput("table")
        )
    )
)
# Define server logic
server <- function(input, output) {
    output$table <- DT::renderDT({
        #splitting values into quantiles
        brks <- quantile(df %>% select(-1), probs = seq(0,1,length.out = 39), na.rm = TRUE)
        #creating a blue palette
        clr_plt_blue_func <- colorRampPalette(c("white","lightblue","skyblue","royalblue","navyblue"))
        clr_plt_blue <- clr_plt_blue_func(40)
        DT::datatable(df,options = list(pageLength=20,
                                        class= 'cell-border stripe',
                                        searching=TRUE,
                                        extensions='FixedColumns',
                                        scrollX = TRUE,
                                        fixedColumns=list(leftColumns=2)
        )
        ) %>% 
            DT::formatStyle(columns =  names(df)[-1], 
                            backgroundColor = DT::styleInterval(brks, clr_plt_blue),
                            color = 'red',
                            fontWeight = 'bold')
    })
}
# Run the application 
shinyApp(ui = ui, server = server)
4

1 回答 1

1

DT

InDT extensions='FixedColumns'需要是datatablenot in 中 的直接参数options

DT::datatable(df,options = list(pageLength=20,
                                    class= 'cell-border stripe',
                                    searching=TRUE,
                                    scrollX = TRUE,
                                    fixedColumns = list(leftColumns = 2)),
                  extensions='FixedColumns'
                  
                  
    ) %>% 
      DT::formatStyle(columns =  names(df)[-1], 
                      backgroundColor = DT::styleInterval(brks, clr_plt_blue),
                      color = 'red',
                      fontWeight = 'bold')

可反应的

这是一个例子reactable。固定列显示在浏览器中,可能不在 R 的查看器选项卡中。

pal <- function(x) rgb(colorRamp(c("white","lightblue","skyblue","royalblue","navyblue"))(x), maxColorValue = 255)

reactable(
  df,
  #x and y scrollable
  pagination = FALSE,
  height = 500,
  #define style for 2:100 column
  defaultColDef = colDef(
    style = function(value) {
      if (!is.numeric(value)) return()
      normalized <- (value - min(df[, -1])) / (max(df[, -1]) - min(df[, -1]))
      color <- pal(normalized)
      list(background = color, color = "red")
    },
    minWidth = 50
  ),
  rownames = TRUE,
  #fix first column and rownames
  columns = list(
    V1 = colDef(
      style = list(position = "sticky",
                   left = "50px", 
                   background = "#fff", 
                   zIndex = 1),
      headerStyle = list(position = "sticky", 
                         left = "50px",
                         background = "#fff", 
                         zIndex = 1)
    ),
    .rownames = colDef(
      style = list(position = "sticky",
                   left = 0,
                   background = "#fff", 
                   color = "black"),
      headerStyle = list(position = "sticky", 
                         left = 0,
                         background = "#fff", 
                         zIndex = 1)
    )
  )
)

于 2021-04-05T21:23:43.420 回答