Skip to content

Commit

Permalink
Leverage bslib::page_navbar()'s more intelligent title->windowTitle h…
Browse files Browse the repository at this point in the history
…andling

Closes #2310
  • Loading branch information
cpsievert committed Jun 1, 2021
1 parent 037b056 commit 4dc67e7
Show file tree
Hide file tree
Showing 2 changed files with 10 additions and 6 deletions.
8 changes: 5 additions & 3 deletions R/bootstrap.R
Original file line number Diff line number Diff line change
Expand Up @@ -380,8 +380,10 @@ collapseSizes <- function(padding) {
#' (useful for viewing on smaller touchscreen device)
#' @param fluid `TRUE` to use a fluid layout. `FALSE` to use a fixed
#' layout.
#' @param windowTitle The title that should be displayed by the browser window.
#' Useful if `title` is not a string.
#' @param windowTitle the browser window title (as a character string). The
#' default value, `NA`, means to use any character strings that appear in
#' `title` (if none are found, the host URL of the page is displayed by
#' default).
#' @inheritParams bootstrapPage
#' @param icon Optional icon to appear on a `navbarMenu` tab.
#'
Expand Down Expand Up @@ -425,7 +427,7 @@ navbarPage <- function(title,
collapsible = FALSE,
fluid = TRUE,
theme = NULL,
windowTitle = title,
windowTitle = NA,
lang = NULL) {
bslib::navbar_page(
..., title = title, id = id, selected = selected,
Expand Down
8 changes: 5 additions & 3 deletions man/navbarPage.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 4dc67e7

Please sign in to comment.