Skip to content

Commit ecada4b

Browse files
committed
fix(themer-demo): Fix button container in bs4
without tying the fix to IS_LEGACY
1 parent ca439d6 commit ecada4b

File tree

1 file changed

+4
-3
lines changed

1 file changed

+4
-3
lines changed

Diff for: inst/themer-demo/app.R

+4-3
Original file line numberDiff line numberDiff line change
@@ -65,15 +65,16 @@ progressBar <- div(
6565

6666
# This is here for shinycoreci to take advantage of (so we don't need to update a bunch of screenshots)
6767
IS_LEGACY <- as.logical(Sys.getenv("BSLIB_LEGACY_THEMER_APP", FALSE))
68-
if (isTRUE(IS_LEGACY || theme_version(theme) %in% c("3", "4"))) {
68+
is_legacy_version <- theme_version(theme) %in% c("3", "4")
69+
if (isTRUE(IS_LEGACY || is_legacy_version)) {
6970
dashboardTab <- NULL
70-
layout_buttons <- tags$div
7171
} else {
7272
dashboardTab <- nav_panel("Dashboard", tipsUI("tips"))
73-
layout_buttons <- layout_columns
7473
theme_set(theme_minimal())
7574
}
7675

76+
layout_buttons <- if (is_legacy_version) tags$div else layout_columns
77+
7778
bs_table <- function(x, class = NULL, ...) {
7879
class <- paste(c("table", class), collapse = " ")
7980
class <- sprintf('class="%s"', class)

0 commit comments

Comments
 (0)