Hi all,
I wanted to add a live counters/progress bar to my dashboard which i will be getting from a excel sheet. The excel sheet will have just the total records number . I had to get the count and add to dashboard. Above the progress bar i am displaying "Total_counts 2021" .Below the bar i should display the counts from excel sheet. Based on the counts my bar has to be displayed. I amnt sure how much will be the count by end of this year. For say if i have 5000 count as of today and 10000 by end of October the bar has to move/increase. I am not sure how i have to do this . With the below code it isnt even printing the value from excel. Can you please help on this.
library(shinydashboard)
library(shiny) # Shiny web app
library(DT) # for data tables
library(shinyWidgets)
library(dplyr)
library(readxl)
ui <- dashboardPage(
dashboardHeader(disable = TRUE),
dashboardSidebar(disable = TRUE),
dashboardBody(
fluidPage(
column(width = 3,tags$b("Total_counts 2021"), br(),
progressBar(id = "count", value = 100)),
verbatimTextOutput("num")
) ))
server <- function(input, output,session) {
tbl1 <- read_excel('test1.xlsx')
output$num <- renderPrint({
tbl1()
})}
# run the app
shinyApp(ui, server)
Please help me on this
Thank you..