Skip to content

Commit

Permalink
Drop is.value() (#187)
Browse files Browse the repository at this point in the history
Since it's never used and `evaluate()` doesn't produce an object of this type.
  • Loading branch information
hadley authored Jun 28, 2024
1 parent 104c375 commit d0e5d98
Show file tree
Hide file tree
Showing 4 changed files with 1 addition and 7 deletions.
1 change: 0 additions & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -19,7 +19,6 @@ export(is.error)
export(is.message)
export(is.recordedplot)
export(is.source)
export(is.value)
export(is.warning)
export(new_output_handler)
export(parse_all)
Expand Down
1 change: 1 addition & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,5 +1,6 @@
# evaluate (development version)

* `is.value()` has been removed since it tests for an object that evaluate never creates.
* `parse_all()` no longer has a default method, which will generate better errors if you pass in something unexpectected.
* The package now depends on R 4.0.0 in order to decrease our maintenance burden.
* `evaluate()` automatically strips calls from conditions emitted by top-level code (these incorrectly get calls because they're wrapped inside `eval()`) (#150).
Expand Down
3 changes: 0 additions & 3 deletions R/evaluation.R
Original file line number Diff line number Diff line change
Expand Up @@ -69,9 +69,6 @@ is.warning <- function(x) inherits(x, "warning")
is.error <- function(x) inherits(x, "error")
#' @rdname is.message
#' @export
is.value <- function(x) inherits(x, "value")
#' @rdname is.message
#' @export
is.source <- function(x) inherits(x, "source")
#' @rdname is.message
#' @export
Expand Down
3 changes: 0 additions & 3 deletions man/is.message.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit d0e5d98

Please sign in to comment.