1

I am building a Shiny dashboard and it has multiple tabs, each tab is in an independent page and can be directed from the tab items in the sidebar.

I am trying to add the page refresh button on each tab by following the link here Page refresh Button in R shiny

However, I can only add it to one tab, it failed when I copied and pasted the same code for other tabs

Below is the current structure that I use:

library(shiny)
library(shinyjs)
library(shinydashboard)

jscode <- "shinyjs.refresh = function() { history.go(0); }"

header <- dashboardHeader(

)

sidebar <- dashboardSidebar(
  tags$head(tags$style(HTML('.content-wrapper { height: 1500px !important;}'))),
  sidebarMenu (
    menuItem("A", tabName = "d1"),
    menuItem("B", tabName = "d2"),
    menuItem("C", tabName = "d3")
  )
)

body <- dashboardBody(
  useShinyjs(),
  extendShinyjs(text = jscode),
  tabItems(
    tabItem(tabName = "d1",
            box(title = "AAA",
                actionButton("refresh", "Save"))
    ),
    tabItem(tabName = "d2",
             box(title = "BBB")
    ),
    tabItem(tabName = "d3",
            box(title = "CCC")
    )
  )
)

# UI
ui <- dashboardPage(header, sidebar, body)

# Server
server <- function(input, output, session) {

  observeEvent({
    input$aa
    input$refresh
  })

  observeEvent(input$refresh, {
    js$refresh();
  })

  observeEvent({
    input$bb
  })

  observeEvent({
    input$cc
  })


}

# Shiny dashboard
shiny::shinyApp(ui, server)

Basically, now I only have the page refresh button called SAVE in tab 1 for input aa.

I am wondering how would I be able to have the same page refresh button on tab 2 and tab 3 for input bb and cc as well. The ideal solution would be having the Shiny dashboard refreshed if users click any save buttons on any pages.

Thanks in advance

MMAASS
  • 433
  • 4
  • 18

2 Answers2

3

You have to create 3 different buttons for each Tab, then you can call one of those to refresh:

library(shiny)
library(shinyjs)
library(shinydashboard)

jscode <- "shinyjs.refresh = function() { history.go(0); }"

header <- dashboardHeader(

)

sidebar <- dashboardSidebar(
  tags$head(tags$style(HTML('.content-wrapper { height: 1500px !important;}'))),
  sidebarMenu (
    menuItem("A", tabName = "d1"),
    menuItem("B", tabName = "d2"),
    menuItem("C", tabName = "d3")
  )
)

body <- dashboardBody(
  useShinyjs(),
  extendShinyjs(text = jscode),
  tabItems(
    tabItem(tabName = "d1",
            box(title = "AAA",
                actionButton("b1", "Save"))
    ),
    tabItem(tabName = "d2",
            box(title = "BBB",
                actionButton("b2", "Save"))
    ),
    tabItem(tabName = "d3",
            box(title = "CCC",
                actionButton("b3", "Save"))
    )
  )
)

# UI
ui <- dashboardPage(header, sidebar, body)

# Server
server <- function(input, output, session) {

  observeEvent(c(input$b1,input$b2,input$b3), {
    js$refresh()
  },ignoreNULL = T,ignoreInit = T)

}

# Shiny dashboard
shiny::shinyApp(ui, server)
Pork Chop
  • 28,528
  • 5
  • 63
  • 77
1

Just in case you are not a huge fun of shinyJS. This code should help you. Have fun

library(shiny)
library(shinydashboard)


dat = data.frame(id = c("d","a","c","b"), a = c(1,2,3,4), b = c(6,7,8,9))

header <- dashboardHeader(

)

sidebar <- dashboardSidebar(
  tags$head(tags$style(HTML('.content-wrapper { height: 1500px !important;}'))),
  sidebarMenu (
    menuItem("A", tabName = "d1"),
    menuItem("B", tabName = "d2"),
    menuItem("C", tabName = "d3")
  )
)

body <- dashboardBody(

  tabItems(
    tabItem(tabName = "d1",
            box(title = "AAA",
                actionButton("refreshTab1_id", "Refresh Tab 1"),
                actionButton("sortTable1_id", "Sort Table 1"),
                DT::dataTableOutput("table_for_tab_1", width = "100%"))
    ),
    tabItem(tabName = "d2",
             box(title = "BBB",
                actionButton("refreshTab2_id", "Refresh Tab 2"),
                actionButton("sortTable2_id", "Sort Table 2"),
                DT::dataTableOutput("table_for_tab_2", width = "100%"))
    ),
    tabItem(tabName = "d3",
            box(title = "CCC",
                actionButton("refreshTab3_id", "Refresh Tab 3"),
                actionButton("sortTable3_id", "Sort Table 3"),
                DT::dataTableOutput("table_for_tab_3", width = "100%"))
    )
  )
)

# UI
ui <- dashboardPage(header, sidebar, body)

# Server
server <- function(input, output, session) {


    observe({

        if (input$sortTable1_id || input$sortTable2_id || input$sortTable3_id) {
            dat_1 = dat %>% dplyr::arrange(id)
        } else {
            dat_1 = dat
        }

        output$table_for_tab_1 <- output$table_for_tab_2 <- output$table_for_tab_3 <- DT::renderDataTable({ 

            DT::datatable(dat_1, 
                    filter = 'bottom', 
                    selection = "single",
                    colnames = c("Id", "A", "B"),
                    options = list(pageLength = 10,
                                    autoWidth = TRUE#,
                                    # columnDefs = list(list(targets = 9, 
                                    #                        visible = FALSE))
                    )
            )
        })
    })

    observe({
        if (input$refreshTab1_id || input$refreshTab2_id || input$refreshTab3_id) {
            session$reload()
        }
    })

}

# Shiny dashboard
shiny::shinyApp(ui, server)
sammgolo
  • 196
  • 8