Shiny Formatting help

...Hello, I am new to Shiny and have a basic shiny app using mtcars. I have multiple tabs with some input dropdowns and presenting the output as DT tables. This is all working fine, but I would now like to use some formatting like formattable. Some of the formatting I would like to include is basic percentage, decimal. Also, I would like to add some cell based highlighting. I have tried multiple formatting functions without any luck. I have added functions within the server side output, but I can not get the right combination. Below is my Shiny code:

ui <- fluidPage(

titlePanel("mtcars"),

sidebarLayout(

sidebarPanel(
  
  selectInput("cyl", 
              "cyl:",
              c(unique(as.character(mtcars$cyl)))), 

    selectInput("gear",
                "gear:",
                c("All",
                  unique(as.character(mtcars$gear)))), width=2),

mainPanel(
  tabsetPanel(
    id = 'dataset',
    tabPanel("Summary", DT::dataTableOutput("Summary")),
    tabPanel("Detail", DT::dataTableOutput("Detail"))))))

server <- function(input, output) {

output$Detail <- renderDataTable(datatable({
data <- mtcars
if (input$cyl != "All") {
data <- data[data$cyl == input$cyl,]
}
if (input$gear != "All") {
data <- data[data$gear == input$gear,]
}
data
}))

output$Summary <- renderDataTable({

cars %>% 
  filter(cyl==input$cyl)  %>% 
  group_by(gear) %>%
  summarise(mpg = median(mpg), 
            count = n())  %>% 
  ungroup() %>%
  arrange(desc(count))

})}

shinyApp(ui = ui, server = server)

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.