簡體   English   中英

R閃亮的顏色數據幀

[英]R shiny color dataframe

我有一個數據框:

   runApp(
      list(ui = bootstrapPage(pageWithSidebar(
        headerPanel("Data frame with colors"),
        sidebarPanel(),
        mainPanel(
           tableOutput("my_dataframe")
        ) 
      )
     )
   ,
    server = function(input, output) {
       output$my_dataframe <- renderTable({ 
               data.frame("Brand ID"=1:4,"Client1"=c("red", "green", "green", "green"),
                                         "Client2"=c("green", "red", "green", "red")) 
       }) 
    }
)
)

是否可以為數據框着色,如:

在此輸入圖像描述

例如,當我有contidion1時,我需要在條件2上用紅色為數據幀單元着色 - 用綠色。

任何幫助將非常感激。

這是一個解決方案。 要使用它,您必須在向量中定義css:

css <- c("#bgred {background-color: #FF0000;}",
          "#bgblue {background-color: #0000FF;}")

並在單元格內寫#...

> data.frame(x=c("A","B"), y=c("red cell #bgred", "blue cell #bgblue"))
  x                 y
1 A   red cell #bgred
2 B blue cell #bgblue

然后使用我的colortable()函數,主要靈感來自highlightHTML包和我個人的閃亮體驗。 這是一個例子:

library(pander)
library(markdown)
library(stringr)
library(shiny)

# function derived from the highlightHTMLcells() function of the highlightHTML package
colortable <- function(htmltab, css, style="table-condensed table-bordered"){
  tmp <- str_split(htmltab, "\n")[[1]] 
  CSSid <- gsub("\\{.+", "", css)
  CSSid <- gsub("^[\\s+]|\\s+$", "", CSSid)
  CSSidPaste <- gsub("#", "", CSSid)
  CSSid2 <- paste(" ", CSSid, sep = "")
  ids <- paste0("<td id='", CSSidPaste, "'")
  for (i in 1:length(CSSid)) {
    locations <- grep(CSSid[i], tmp)
    tmp[locations] <- gsub("<td", ids[i], tmp[locations])
    tmp[locations] <- gsub(CSSid2[i], "", tmp[locations], 
                           fixed = TRUE)
  }
  htmltab <- paste(tmp, collapse="\n")
  Encoding(htmltab) <- "UTF-8"
  list(
    tags$style(type="text/css", paste(css, collapse="\n")),
    tags$script(sprintf( 
                  '$( "table" ).addClass( "table %s" );', style
                )),
    HTML(htmltab)
  )
}

##
runApp(
  list(
    ui=pageWithSidebar(
      headerPanel(""),
      sidebarPanel(
      ),
      mainPanel(
        uiOutput("htmltable")
      )
    ),
    server=function(input,output,session){
      output$htmltable <- renderUI({
        # define CSS tags
        css <- c("#bgred {background-color: #FF0000;}",
                 "#bgblue {background-color: #0000FF;}")
        # example data frame 
        # add the tag inside the cells
        tab <- data.frame(x=c("A","B"), y=c("red cell #bgred", "blue cell #bgblue"))
        # generate html table with pander package and markdown package
        htmltab <- markdownToHTML(
          text=pandoc.table.return(
            tab, 
            style="rmarkdown", split.tables=Inf
          ), 
          fragment.only=TRUE
        ) 
        colortable(htmltab, css)
      })
    })
)

在此輸入圖像描述

如今使用shinyTables有更優雅的解決方案:

# Install devtools, if you haven't already.
install.packages("devtools")

library(devtools)
install_github("shinyTable", "trestletech")
library(shiny)
runApp(system.file("examples/01-simple", package="shinyTable"))

github中的代碼: 示例:

暫無
暫無

聲明:本站的技術帖子網頁,遵循CC BY-SA 4.0協議,如果您需要轉載,請注明本站網址或者原文地址。任何問題請咨詢:yoyou2525@163.com.

 
粵ICP備18138465號  © 2020-2024 STACKOOM.COM