Skip to content

Commit

Permalink
use "light" navbar by default
Browse files Browse the repository at this point in the history
  • Loading branch information
gadenbuie committed Feb 12, 2024
1 parent 5e4ce97 commit 71aa616
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/navbar.R
Original file line number Diff line number Diff line change
Expand Up @@ -21,7 +21,7 @@ navbar_style <- function(navbar = list(), theme = "_default", bs_version = 3) {
list(type = navbar$type %||% "default")
} else {
# bg is usually light, dark, or primary, but can use any .bg-*
bg <- navbar$bg %||% bootswatch_bg[[theme]]
bg <- navbar$bg %||% purrr::pluck(bootswatch_bg, theme, .default = "light")
type <- navbar$type %||% if (bg == "light") "light" else "dark"

list(bg = bg, type = type)
Expand Down

0 comments on commit 71aa616

Please sign in to comment.