Skip to content

Commit 56ab530

Browse files
cpsievertschloerke
andauthored
v1.9.0 release candidate (#4105)
* Start v1.9.0 release candidate * Check-in revdep results * `yarn build` (GitHub Actions) * Sync package version (GitHub Actions) * `yarn build` (GitHub Actions) * ran revdepcheck on cloud. 2 errors reported. Both seem like false positives * Fix R CMD check note about Rd links targets missing package anchors --------- Co-authored-by: cpsievert <[email protected]> Co-authored-by: Barret Schloerke <[email protected]> Co-authored-by: schloerke <[email protected]>
1 parent 599209a commit 56ab530

21 files changed

+194
-59
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
Package: shiny
22
Type: Package
33
Title: Web Application Framework for R
4-
Version: 1.8.1.9001
4+
Version: 1.9.0
55
Authors@R: c(
66
person("Winston", "Chang", role = c("aut", "cre"), email = "[email protected]", comment = c(ORCID = "0000-0002-1576-2126")),
77
person("Joe", "Cheng", role = "aut", email = "[email protected]"),

NEWS.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
# shiny (development version)
1+
# shiny 1.9.0
22

33
## New busy indication feature
44

R/bootstrap.R

Lines changed: 4 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -172,9 +172,10 @@ setCurrentTheme <- function(theme) {
172172

173173
#' Register a theme dependency
174174
#'
175-
#' This function registers a function that returns an [htmlDependency()] or list
176-
#' of such objects. If `session$setCurrentTheme()` is called, the function will
177-
#' be re-executed, and the resulting html dependency will be sent to the client.
175+
#' This function registers a function that returns an
176+
#' [htmltools::htmlDependency()] or list of such objects. If
177+
#' `session$setCurrentTheme()` is called, the function will be re-executed, and
178+
#' the resulting html dependency will be sent to the client.
178179
#'
179180
#' Note that `func` should **not** be an anonymous function, or a function which
180181
#' is defined within the calling function. This is so that,

R/reactives.R

Lines changed: 4 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -951,7 +951,10 @@ Observable <- R6Class(
951951
#' See the [Shiny tutorial](https://shiny.rstudio.com/tutorial/) for
952952
#' more information about reactive expressions.
953953
#'
954-
#' @param x For `is.reactive()`, an object to test. For `reactive()`, an expression. When passing in a [`quo()`]sure with `reactive()`, remember to use [`rlang::inject()`] to distinguish that you are passing in the content of your quosure, not the expression of the quosure.
954+
#' @param x For `is.reactive()`, an object to test. For `reactive()`, an
955+
#' expression. When passing in a [`rlang::quo()`]sure with `reactive()`,
956+
#' remember to use [`rlang::inject()`] to distinguish that you are passing in
957+
#' the content of your quosure, not the expression of the quosure.
955958
#' @template param-env
956959
#' @templateVar x x
957960
#' @templateVar env env

R/utils-lang.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -53,8 +53,8 @@ formalsAndBody <- function(x) {
5353

5454
#' @describeIn createRenderFunction convert a quosure to a function.
5555
#' @param q Quosure of the expression `x`. When capturing expressions to create
56-
#' your quosure, it is recommended to use [`enquo0()`] to not unquote the
57-
#' object too early. See [`enquo0()`] for more details.
56+
#' your quosure, it is recommended to use [`rlang::enquo0()`] to not unquote
57+
#' the object too early. See [`rlang::enquo0()`] for more details.
5858
#' @inheritParams installExprFunction
5959
#' @export
6060
quoToFunction <- function(

inst/www/shared/busy-indicators/busy-indicators.css

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/www/shared/shiny-autoreload.js

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/www/shared/shiny-showcase.css

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/www/shared/shiny-showcase.js

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

inst/www/shared/shiny-testmode.js

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)