Skip to content

Commit

Permalink
Account for change in is.atomic() of R 4.4 (#1691)
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy committed May 31, 2024
1 parent 2fb66b4 commit 5338bff
Showing 1 changed file with 5 additions and 4 deletions.
9 changes: 5 additions & 4 deletions R/types.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,8 +9,8 @@
#' * The predicates for vectors include the `n` argument for
#' pattern-matching on the vector length.
#'
#' * Unlike `is.atomic()`, `is_atomic()` does not return `TRUE` for
#' `NULL`.
#' * Unlike `is.atomic()` in R < 4.4.0, `is_atomic()` does not return `TRUE` for
#' `NULL`. Starting in R 4.4.0 `is.atomic(NULL)` returns FALSE.
#'
#' * Unlike `is.vector()`, `is_vector()` tests if an object is an
#' atomic vector or a list. `is.vector` checks for the presence of
Expand Down Expand Up @@ -197,8 +197,9 @@ is_bool <- function(x) {
#' * The predicates for vectors include the `n` argument for
#' pattern-matching on the vector length.
#'
#' * Like [is_atomic()] and unlike base R `is.atomic()`,
#' `is_bare_atomic()` does not return `TRUE` for `NULL`.
#' * Like [is_atomic()] and unlike base R `is.atomic()` for R < 4.4.0,
#' `is_bare_atomic()` does not return `TRUE` for `NULL`. Starting in
#' R 4.4.0, `is.atomic(NULL)` returns FALSE.
#'
#' * Unlike base R `is.numeric()`, `is_bare_double()` only returns
#' `TRUE` for floating point numbers.
Expand Down

0 comments on commit 5338bff

Please sign in to comment.