Skip to content

Commit

Permalink
Revert "Change entry-point for dependencies to be bs_theme_dependenci…
Browse files Browse the repository at this point in the history
…es() instead of page() constructors"

This reverts commit 147462a from #810
  • Loading branch information
gadenbuie committed Nov 2, 2023
1 parent b5ab607 commit a928fad
Show file tree
Hide file tree
Showing 2 changed files with 16 additions and 4 deletions.
1 change: 0 additions & 1 deletion R/bs-dependencies.R
Original file line number Diff line number Diff line change
Expand Up @@ -146,7 +146,6 @@ bs_theme_dependencies <- function(
meta = list(viewport = "width=device-width, initial-scale=1, shrink-to-fit=no")
)
),
if (version >= 5) component_dependencies(),
htmlDependencies(out_file)
))
}
Expand Down
19 changes: 16 additions & 3 deletions R/page.R
Original file line number Diff line number Diff line change
Expand Up @@ -25,7 +25,8 @@ page <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
tags$body(...),
title = title,
theme = theme,
lang = lang
lang = lang,
component_dependencies()
),
theme = theme
)
Expand All @@ -37,7 +38,13 @@ page <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
#' @export
page_fluid <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
as_page(
shiny::fluidPage(..., title = title, theme = theme, lang = lang),
shiny::fluidPage(
...,
title = title,
theme = theme,
lang = lang,
component_dependencies()
),
theme = theme
)
}
Expand All @@ -49,7 +56,13 @@ page_fluid <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
#' @export
page_fixed <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
as_page(
shiny::fixedPage(..., title = title, theme = theme, lang = lang),
shiny::fixedPage(
...,
title = title,
theme = theme,
lang = lang,
component_dependencies()
),
theme = theme
)
}
Expand Down

0 comments on commit a928fad

Please sign in to comment.