R shiny - Integration between R semantic and R Material

I want to bring a semantic tabular column to the shiny material dashboard.

library(shiny)
library(shinymaterial)
library(shiny.semantic)
library(gapminder)
library(magrittr)
countries <- unique(gapminder[, c("country", "continent")])
table_data <- data.frame(
Name = c("John Smith", "Lindsay More"),
City = c("Warsaw, Poland", "SF, United States"),
Revenue = c("$210.50", "$172.78"))

ui <- material_page(
title = "shinymaterial",
tags$br(),
material_row(
div(class = "ui raised segment", style="margin-left: 20px; max-width: 350px; width: 100%",
a(class="ui green ribbon label", "Client's info"),
p(),
xtable::xtable(table_data) %>%
print(html.table.attributes="class = 'ui very basic collapsing celled table'",
type = "html", include.rownames = F, print.results = F) %>%
HTML
)
)
)
server <- function(input, output) {
output$mytable <- renderTable({
tab <- matrix(rep(1,6),nrow=3)
colnames(tab) <- c('col1','col2')
tab
})
}

shinyApp(ui = ui, server = server)

Thanks and regards,
Sarveshwaran R
...download

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