Skip to content

Commit

Permalink
Merge branch 'main' into input-switch
Browse files Browse the repository at this point in the history
  • Loading branch information
cpsievert committed Jun 26, 2023
2 parents dc33aa1 + 10dddd0 commit e0aa340
Show file tree
Hide file tree
Showing 181 changed files with 10,167 additions and 1,706 deletions.
5 changes: 4 additions & 1 deletion .Rbuildignore
Original file line number Diff line number Diff line change
Expand Up @@ -11,12 +11,15 @@ inst/lib/bsw3/.npmignore
^README\.Rmd$
^\.travis\.yml$
^docs$
^sandbox$
^sandbox$'
^_dev$
^revdep$
^pkgdown$
^_pkgdown\.yml$
^vignettes$
^sandbox$

^srcts$
^node_modules$
^package\.json$
^tsconfig\.json$
Expand Down
22 changes: 14 additions & 8 deletions .github/shiny-workflows/__update_website_deps.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,16 +5,22 @@ desc_pkgs <- desc::desc_get_deps()$package

set_desc_with_packages <- function(field, known_pkgs) {

pkgs <- sort(setdiff(known_pkgs, c("R", "bslib", desc_pkgs, base_pkgs)))
config_field <- paste0("Config/Needs/", field)
config_pkgs <- strsplit(desc::desc_get_field(config_field), "[[:space:],]+")[[1]]
pkgs <- sort(setdiff(known_pkgs, c("R", "bslib", desc_pkgs, base_pkgs, config_pkgs)))

pkg_txt <- paste0(paste0("\n ", pkgs), collapse = ",")
desc::desc_set(paste0("Config/Needs/", field), pkg_txt)
all_pkgs <- sort(c(config_pkgs, pkgs))
pkg_txt <- paste0(paste0("\n ", all_pkgs), collapse = ",")
desc::desc_set(config_field, pkg_txt)
}


demo_pkgs <- unique(renv::dependencies("inst/themer-demo", progress = FALSE)$Package)
vig_pkgs <- unique(renv::dependencies("vignettes", progress = FALSE)$Package)
demo_pkgs <-renv::dependencies(
c("inst/themer-demo", list.dirs("inst/examples")),
progress = FALSE
)$Package
# BH/cpp11 is not picked up for some reason
set_desc_with_packages("deploy", unique(c("BH", "cpp11", demo_pkgs)))

set_desc_with_packages("website", vig_pkgs)
# BH is not picked up for some reason
set_desc_with_packages("deploy", c("BH", demo_pkgs))
vig_pkgs <- renv::dependencies("vignettes", progress = FALSE)$Package
set_desc_with_packages("website", unique(vig_pkgs))
12 changes: 12 additions & 0 deletions .github/workflows/R-CMD-check.yaml
Original file line number Diff line number Diff line change
Expand Up @@ -43,6 +43,18 @@ jobs:
install.packages("rsconnect")
pak::pkg_install("rstudio/bslib", dependencies = TRUE, upgrade = TRUE)
# Workaround for this (probably spurious error):
# https://github.com/rstudio/bslib/actions/runs/4963164313/jobs/8882217868#step:6:32
- name: Install rlang
shell: Rscript {0}
run: |
install.packages("rlang")
- name: Install cpp11
shell: Rscript {0}
run: |
install.packages("cpp11")
- name: Register account
shell: Rscript {0}
run: |
Expand Down
5 changes: 5 additions & 0 deletions .gitignore
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,7 @@ docs/
sandbox/
revdep/
inst/themer-demo/deploy/rsconnect
inst/examples/*/rsconnect/

node_modules/

Expand All @@ -17,3 +18,7 @@ inst/doc
inst/yarn.lock

inst/rmarkdown/templates/*/skeleton/skeleton.html

vignettes/*.html
# rendered examples that appear in iframes
vignettes/examples
81 changes: 56 additions & 25 deletions DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,10 +1,11 @@
Package: bslib
Title: Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'
Version: 0.4.2.9000
Version: 0.5.0.9000
Authors@R: c(
person("Carson", "Sievert", role = c("aut", "cre"), email = "carson@rstudio.com", comment = c(ORCID = "0000-0002-4958-2844")),
person("Joe", "Cheng", role = "aut", email = "joe@rstudio.com"),
person(family = "RStudio", role = "cph"),
person("Garrick", "Aden-Buie", role = "aut", email = "garrick@posit.co", comment = c(ORCID = "0000-0002-7111-0077")),
person(given = "Posit Software, PBC", role = c("cph", "fnd")),
person(family = "Bootstrap contributors", role = "ctb",
comment = "Bootstrap library"),
person(family = "Twitter, Inc", role = "cph",
Expand All @@ -16,50 +17,61 @@ Authors@R: c(
person(family = "PayPal", role = c("ctb", "cph"),
comment = "Bootstrap accessibility plugin")
)
Description: Simplifies custom 'CSS' styling of both 'shiny' and 'rmarkdown' via 'Bootstrap' 'Sass'. Supports 'Bootstrap' 3, 4 and 5 as well as their various 'Bootswatch' themes. An interactive widget is also provided for previewing themes in real time.
Depends: R (>= 2.10)
Description: Simplifies custom 'CSS' styling of both 'shiny' and
'rmarkdown' via 'Bootstrap' 'Sass'. Supports 'Bootstrap' 3, 4 and 5 as
well as their various 'Bootswatch' themes. An interactive widget is
also provided for previewing themes in real time.
License: MIT + file LICENSE
URL: https://rstudio.github.io/bslib/, https://github.com/rstudio/bslib
BugReports: https://github.com/rstudio/bslib/issues
Depends:
R (>= 2.10)
Imports:
base64enc,
cachem,
grDevices,
htmltools (>= 0.5.4),
jsonlite,
sass (>= 0.4.0),
jquerylib (>= 0.1.3),
rlang,
cachem,
jsonlite,
memoise (>= 2.0.1),
base64enc,
mime
mime,
rlang,
sass (>= 0.4.0)
Suggests:
shiny (>= 1.6.0),
rmarkdown (>= 2.7),
thematic,
knitr,
testthat,
withr,
rappdirs,
bsicons,
curl,
magrittr,
fontawesome,
bsicons
License: MIT + file LICENSE
ggplot2,
knitr,
magrittr,
rappdirs,
rmarkdown (>= 2.7),
shiny (>= 1.6.0),
testthat,
thematic,
withr
Encoding: UTF-8
RoxygenNote: 7.2.3
Roxygen: list(markdown = TRUE)
Collate:
'accordion.R'
'bootswatch.R'
'breakpoints.R'
'bs-current-theme.R'
'bs-dependencies.R'
'bs-global.R'
'bs-remove.R'
'bs-theme-layers.R'
'bs-theme-preset-bootswatch.R'
'bs-theme-preset-builtin.R'
'bs-theme-preset.R'
'utils.R'
'bs-theme-preview.R'
'bs-theme-update.R'
'bs-theme.R'
'card.R'
'deprecated.R'
'files.R'
'fill.R'
'imports.R'
'input-switch.R'
'layout.R'
Expand All @@ -72,36 +84,55 @@ Collate:
'precompiled.R'
'print.R'
'shiny-devmode.R'
'sidebar.R'
'staticimports.R'
'utils-shiny.R'
'utils-tags.R'
'value-box.R'
'version-default.R'
'versions.R'
URL: https://rstudio.github.io/bslib/, https://github.com/rstudio/bslib
BugReports: https://github.com/rstudio/bslib/issues
Config/testthat/edition: 3
Config/Needs/routine:
chromote,
desc,
renv
Config/Needs/website:
brio,
crosstalk,
dplyr,
DT,
ggplot2,
glue,
htmlwidgets,
leaflet,
lorem,
palmerpenguins,
plotly,
purrr,
rprojroot,
rstudio/htmltools,
scales,
stringr,
tidyr
tidyr,
webshot2
Config/Needs/deploy:
BH,
cpp11,
dplyr,
DT,
ggplot2,
ggridges,
gt,
hexbin,
histoslider,
lattice,
leaflet,
lubridate,
modelr,
nycflights13,
plotly,
reactable,
reshape2,
rprojroot,
rsconnect
rsconnect,
scales
29 changes: 29 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
@@ -1,5 +1,10 @@
# Generated by roxygen2: do not edit by hand

S3method(is_fill_item,default)
S3method(is_fill_item,htmlwidget)
S3method(is_fillable_container,default)
S3method(is_fillable_container,htmlwidget)
S3method(print,bslib_breakpoints)
S3method(print,bslib_fragment)
S3method(print,bslib_page)
export(accordion)
Expand All @@ -11,9 +16,13 @@ export(accordion_panel_remove)
export(accordion_panel_set)
export(accordion_panel_update)
export(as.card_item)
export(as_fill_carrier)
export(as_fill_item)
export(as_fillable_container)
export(bootstrap)
export(bootstrap_sass)
export(bootswatch_themes)
export(breakpoints)
export(bs_add_declarations)
export(bs_add_functions)
export(bs_add_mixins)
Expand Down Expand Up @@ -50,6 +59,7 @@ export(bs_theme_preview)
export(bs_theme_set)
export(bs_theme_update)
export(bs_themer)
export(builtin_themes)
export(card)
export(card_body)
export(card_body_fill)
Expand All @@ -64,14 +74,21 @@ export(font_link)
export(input_switch)
export(is.card_item)
export(is_bs_theme)
export(is_fill_carrier)
export(is_fill_item)
export(is_fillable_container)
export(layout_column_wrap)
export(layout_columns)
export(layout_sidebar)
export(nav)
export(nav_append)
export(nav_content)
export(nav_hide)
export(nav_insert)
export(nav_item)
export(nav_menu)
export(nav_panel)
export(nav_panel_hidden)
export(nav_prepend)
export(nav_remove)
export(nav_select)
Expand All @@ -84,15 +101,27 @@ export(navs_pill_card)
export(navs_pill_list)
export(navs_tab)
export(navs_tab_card)
export(navset_bar)
export(navset_card_pill)
export(navset_card_tab)
export(navset_hidden)
export(navset_pill)
export(navset_pill_list)
export(navset_tab)
export(page)
export(page_fill)
export(page_fillable)
export(page_fixed)
export(page_fluid)
export(page_navbar)
export(page_sidebar)
export(precompiled_css_path)
export(remove_all_fill)
export(run_with_themer)
export(showcase_left_center)
export(showcase_top_right)
export(sidebar)
export(sidebar_toggle)
export(theme_bootswatch)
export(theme_version)
export(update_switch)
Expand Down
Loading

0 comments on commit e0aa340

Please sign in to comment.