Skip to content

Commit

Permalink
Start v1.7.5.1 release candidate
Browse files Browse the repository at this point in the history
  • Loading branch information
cpsievert committed Oct 5, 2023
1 parent 0b97ee1 commit e888f43
Show file tree
Hide file tree
Showing 3 changed files with 11 additions and 4 deletions.
6 changes: 6 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,3 +1,9 @@
# shiny 1.7.5.1

## Bug fixes

* On r-devel (R > 4.3.1), `isTruthy(NULL)` now returns `FALSE` (as it does with older versions of R). (#3906)

# shiny 1.7.5

## Possibly breaking changes
Expand Down
6 changes: 2 additions & 4 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -1240,14 +1240,12 @@ dotloop <- function(fun_, ...) {
#' @param x An expression whose truthiness value we want to determine
#' @export
isTruthy <- function(x) {
if (is.null(x))
return(FALSE)
if (inherits(x, 'try-error'))
return(FALSE)

if (!is.atomic(x))
return(TRUE)

if (is.null(x))
return(FALSE)
if (length(x) == 0)
return(FALSE)
if (all(is.na(x)))
Expand Down
3 changes: 3 additions & 0 deletions tests/testthat/test-tabPanel.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,6 +18,9 @@ expect_snapshot2 <- function(...) {
if (getRversion() < "3.6.0") {
skip("Skipping snapshots on R < 3.6 because of different RNG method")
}
if (packageVersion("htmltools") <= "0.5.6" && getRversion() > "4.3.1") {
skip("Skipping snapshots since htmltools is 'outdated'")
}
expect_snapshot(...)
}

Expand Down

0 comments on commit e888f43

Please sign in to comment.