Skip to content

Commit 112efd0

Browse files
cpsievertschloerkegadenbuie
authored
v0.8.0 release candidate (#1094)
* Start v0.8.0 release candidate * `yarn build` (GitHub Actions) * ran revdepcheck on cloud. No known issues * `yarn build` (GitHub Actions) * re-run checks * fix(page): Allow empty dots in page functions (#1095) * fix empty trailing arguments in dots of page functions * Add unit tests --------- Co-authored-by: Carson <[email protected]> * Update snapshot tests * Follow up to #1093: card_image() used to fill by default * Fix R CMD check note about Rd links targets missing package anchors * Missed a few --------- Co-authored-by: cpsievert <[email protected]> Co-authored-by: Barret Schloerke <[email protected]> Co-authored-by: Garrick Aden-Buie <[email protected]> Co-authored-by: gadenbuie <[email protected]>
1 parent 65c1fe9 commit 112efd0

29 files changed

+85
-126
lines changed

DESCRIPTION

+1-3
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
Package: bslib
22
Title: Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'
3-
Version: 0.7.0.9000
3+
Version: 0.8.0
44
Authors@R: c(
55
person("Carson", "Sievert", , "[email protected]", role = c("aut", "cre"),
66
comment = c(ORCID = "0000-0002-4958-2844")),
@@ -55,8 +55,6 @@ Suggests:
5555
testthat,
5656
thematic,
5757
withr
58-
Remotes:
59-
rstudio/shiny
6058
Config/Needs/deploy:
6159
BH,
6260
chiflights22,

NEWS.md

+1-1
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
# bslib (development version)
1+
# bslib 0.8.0
22

33
## Breaking changes
44

R/bs-dependencies.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -159,7 +159,7 @@ bs_theme_dependencies <- function(
159159
#' variables, functions, and/or mixins (i.e., stuff inside of `theme`).
160160
#' `bs_dependencies()` makes it a bit easier to create themeable components by
161161
#' compiling [sass::sass()] (`input`) together with Bootstrap Sass inside of a
162-
#' `theme`, and packaging up the result into an [htmlDependency()].
162+
#' `theme`, and packaging up the result into an [htmltools::htmlDependency()].
163163
#'
164164
#' Themable components can also be _dynamically_ themed inside of Shiny (i.e.,
165165
#' they may be themed in 'real-time' via [bs_themer()], and more generally,
@@ -246,7 +246,7 @@ bs_dependency <- function(input = list(), theme, name, version,
246246
#' @rdname bs_dependency
247247
#' @param func a _non-anonymous_ function, with a _single_ argument.
248248
#' This function should accept a [bs_theme()] object and return a single
249-
#' [htmlDependency()], a list of them, or `NULL`.
249+
#' [htmltools::htmlDependency()], a list of them, or `NULL`.
250250
#' @param memoise whether or not to memoise (i.e., cache) `func` results for a
251251
#' short period of time. The default, `TRUE`, can have large performance
252252
#' benefits when many instances of the same themable widget are rendered. Note

R/fill.R

+3-3
Original file line numberDiff line numberDiff line change
@@ -17,8 +17,8 @@
1717
#'
1818
#' @details
1919
#' Although `as_fill()`, `as_fillable()`, and `as_fill_carrier()` can work with
20-
#' non-tag objects that have a [as.tags] method (e.g., htmlwidgets), they return
21-
#' the "tagified" version of that object.
20+
#' non-tag objects that have a [htmltools::as.tags] method (e.g., htmlwidgets),
21+
#' they return the "tagified" version of that object.
2222
#'
2323
#' @examplesIf rlang::is_interactive()
2424
#' library(shiny)
@@ -56,7 +56,7 @@
5656
#' @param style A character vector of CSS properties to add to the tag.
5757
#' @param css_selector A character string containing a CSS selector for
5858
#' targeting particular (inner) tag(s) of interest. For more details on what
59-
#' selector(s) are supported, see [tagAppendAttributes()].
59+
#' selector(s) are supported, see [htmltools::tagAppendAttributes()].
6060
#'
6161
#' @export
6262
as_fill_carrier <- function(x, ..., min_height = NULL, max_height = NULL, gap = NULL, class = NULL, style = NULL, css_selector = NULL) {

R/nav-items.R

+4-4
Original file line numberDiff line numberDiff line change
@@ -4,13 +4,13 @@
44
#' [navset_bar()], etc).
55
#'
66
#' @param title A title to display. Can be a character string or UI elements
7-
#' (i.e., [tags]).
7+
#' (i.e., [htmltools::tags]).
88
#' @param ... Depends on the function:
9-
#' * For `nav_panel()` and `nav_panel_hidden()`: UI elements (i.e., [tags]) to
10-
#' display when the item is active.
9+
#' * For `nav_panel()` and `nav_panel_hidden()`: UI elements (i.e.,
10+
#' [htmltools::tags]) to display when the item is active.
1111
#' * For `nav_menu()`: a collection of nav items (e.g., `nav_panel()`,
1212
#' `nav_item()`).
13-
#' * For `nav_item()`: UI elements (i.e., [tags]) to place directly in
13+
#' * For `nav_item()`: UI elements (i.e., [htmltools::tags]) to place directly in
1414
#' the navigation panel (e.g., search forms, links to external content, etc).
1515
#' @param value A character string to assign to the nav item. This value may be
1616
#' supplied to the relevant container's `selected` argument in order to show

R/navs-legacy.R

+4-2
Original file line numberDiff line numberDiff line change
@@ -12,8 +12,10 @@
1212
#' [nav_select()]).
1313
#' @param selected a character string matching the `value` of a particular
1414
#' [nav_panel()] item to selected by default.
15-
#' @param header UI element(s) ([tags]) to display _above_ the nav content.
16-
#' @param footer UI element(s) ([tags]) to display _below_ the nav content.
15+
#' @param header UI element(s) ([htmltools::tags]) to display _above_ the nav
16+
#' content.
17+
#' @param footer UI element(s) ([htmltools::tags]) to display _below_ the nav
18+
#' content.
1719
#'
1820
#' @seealso [nav_panel()], [nav_panel_hidden()] create panels of content.
1921
#' @seealso [nav_menu()], [nav_item()], [nav_spacer()] create menus, items, or

R/page.R

+8-8
Original file line numberDiff line numberDiff line change
@@ -43,12 +43,12 @@ page <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
4343
page_fluid <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
4444
as_page(
4545
shiny::fluidPage(
46+
# Components require Bootstrap 5+
47+
if (isTRUE(theme_version(theme) >= 5)) component_dependencies(),
4648
...,
4749
title = title,
4850
theme = theme,
49-
lang = lang,
50-
# Components require Bootstrap 5+
51-
if (isTRUE(theme_version(theme) >= 5)) component_dependencies()
51+
lang = lang
5252
),
5353
theme = theme
5454
)
@@ -62,12 +62,12 @@ page_fluid <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
6262
page_fixed <- function(..., title = NULL, theme = bs_theme(), lang = NULL) {
6363
as_page(
6464
shiny::fixedPage(
65+
# Components require Bootstrap 5+
66+
if (isTRUE(theme_version(theme) >= 5)) component_dependencies(),
6567
...,
6668
title = title,
6769
theme = theme,
68-
lang = lang,
69-
# Components require Bootstrap 5+
70-
if (isTRUE(theme_version(theme) >= 5)) component_dependencies()
70+
lang = lang
7171
),
7272
theme = theme
7373
)
@@ -186,9 +186,9 @@ page_fillable <- function(
186186
padding = validateCssPadding(padding),
187187
gap = validateCssUnit(gap)
188188
),
189-
...,
189+
as_fillable_container(),
190190
tags$head(tags$style("html { height: 100%; }")),
191-
as_fillable_container()
191+
...
192192
)
193193
}
194194

R/popover.R

+3-2
Original file line numberDiff line numberDiff line change
@@ -10,9 +10,10 @@
1010
#' [shiny::actionButton()] or similar). If `trigger` renders as multiple HTML
1111
#' elements (e.g., it's a `tagList()`), the last HTML element is used for the
1212
#' trigger. If the `trigger` should contain all of those elements, wrap the
13-
#' object in a [div()] or [span()].
13+
#' object in a [htmltools::div()] or [htmltools::span()].
1414
#' @param ... UI elements for the popover's body. Character strings are
15-
#' [automatically escaped][htmlEscape()] unless marked as [HTML()].
15+
#' [automatically escaped][htmltools::htmlEscape()] unless marked as
16+
#' [htmltools::HTML()].
1617
#' @param title A title (header) for the popover. To remove a header
1718
#' with `update_popover()`, provide a either an empty string or `character(0)`.
1819
#' @param id A character string. Required to re-actively respond to the

R/print.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -26,7 +26,7 @@ print.bslib_fragment <- function(x, ...) {
2626
#' Save a bslib page/fragment as HTML
2727
#'
2828
#' @param html a bslib page/fragment.
29-
#' @param ... passed along to an underlying [save_html()] method.
29+
#' @param ... passed along to an underlying [htmltools::save_html()] method.
3030
#' @export
3131
#' @keywords internal
3232
#' @rdname save-html

R/tooltip.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -9,9 +9,9 @@
99
#' as the tooltip trigger. If `trigger` renders as multiple HTML
1010
#' elements (e.g., it's a `tagList()`), the last HTML element is used for the
1111
#' trigger. If the `trigger` should contain all of those elements, wrap the
12-
#' object in a [div()] or [span()].
12+
#' object in a [htmltools::div()] or [htmltools::span()].
1313
#' @param ... UI elements for the tooltip. Character strings are [automatically
14-
#' escaped][htmlEscape()] unless marked as [HTML()].
14+
#' escaped][htmltools::htmlEscape()] unless marked as [htmltools::HTML()].
1515
#' @param id A character string. Required to re-actively respond to the
1616
#' visibility of the tooltip (via the `input[[id]]` value) and/or update the
1717
#' visibility/contents of the tooltip.

inst/components/dist/components.js

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/components/dist/components.min.js

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/components/dist/web-components.js

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/components/dist/web-components.min.js

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/examples-shiny/card/app.R

+1
Original file line numberDiff line numberDiff line change
@@ -72,6 +72,7 @@ main_grid <- layout_column_wrap(
7272
card_body(card_image(
7373
file = "www/shiny-hex.svg",
7474
height = 200,
75+
fill = TRUE,
7576
href = "https://github.com/rstudio/shiny"
7677
))
7778
),

man/as_fill_carrier.Rd

+3-3
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/bs_dependency.Rd

+2-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/nav-items.Rd

+4-4
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/navset.Rd

+4-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/page_navbar.Rd

+4-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/popover.Rd

+3-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/save-html.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/tooltip.Rd

+2-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

revdep/README.md

-6
Original file line numberDiff line numberDiff line change
@@ -1,8 +1,2 @@
11
# Revdeps
22

3-
## Failed to check (1)
4-
5-
|package |version |error |warning |note |
6-
|:--------------|:-------|:-----|:-------|:----|
7-
|multilevelcoda |1.2.3 |1 | | |
8-

revdep/cran.md

+2-7
Original file line numberDiff line numberDiff line change
@@ -1,12 +1,7 @@
11
## revdepcheck results
22

3-
We checked 60 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package.
3+
We checked 67 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package.
44

55
* We saw 0 new problems
6-
* We failed to check 1 packages
6+
* We failed to check 0 packages
77

8-
Issues with CRAN packages are summarised below.
9-
10-
### Failed to check
11-
12-
* multilevelcoda (NA)

revdep/failures.md

+1-60
Original file line numberDiff line numberDiff line change
@@ -1,60 +1 @@
1-
# multilevelcoda
2-
3-
<details>
4-
5-
* Version: 1.2.3
6-
* GitHub: https://github.com/florale/multilevelcoda
7-
* Source code: https://github.com/cran/multilevelcoda
8-
* Date/Publication: 2024-03-10 23:00:03 UTC
9-
* Number of recursive dependencies: 160
10-
11-
Run `revdepcheck::cloud_details(, "multilevelcoda")` for more info
12-
13-
</details>
14-
15-
## In both
16-
17-
* checking whether package ‘multilevelcoda’ can be installed ... ERROR
18-
```
19-
Installation failed.
20-
See ‘/tmp/workdir/multilevelcoda/new/multilevelcoda.Rcheck/00install.out’ for details.
21-
```
22-
23-
## Installation
24-
25-
### Devel
26-
27-
```
28-
* installing *source* package ‘multilevelcoda’ ...
29-
** package ‘multilevelcoda’ successfully unpacked and MD5 sums checked
30-
** using staged installation
31-
** R
32-
** data
33-
*** moving datasets to lazyload DB
34-
** inst
35-
** byte-compile and prepare package for lazy loading
36-
Error: object ‘launch_shinystan’ is not exported by 'namespace:brms'
37-
Execution halted
38-
ERROR: lazy loading failed for package ‘multilevelcoda’
39-
* removing ‘/tmp/workdir/multilevelcoda/new/multilevelcoda.Rcheck/multilevelcoda’
40-
41-
42-
```
43-
### CRAN
44-
45-
```
46-
* installing *source* package ‘multilevelcoda’ ...
47-
** package ‘multilevelcoda’ successfully unpacked and MD5 sums checked
48-
** using staged installation
49-
** R
50-
** data
51-
*** moving datasets to lazyload DB
52-
** inst
53-
** byte-compile and prepare package for lazy loading
54-
Error: object ‘launch_shinystan’ is not exported by 'namespace:brms'
55-
Execution halted
56-
ERROR: lazy loading failed for package ‘multilevelcoda’
57-
* removing ‘/tmp/workdir/multilevelcoda/old/multilevelcoda.Rcheck/multilevelcoda’
58-
59-
60-
```
1+
*Wow, no problems at all. :)*

0 commit comments

Comments
 (0)