diff --git a/NAMESPACE b/NAMESPACE index fa47a56ee..83d77dec4 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -34,7 +34,6 @@ S3method(format_type_sum,default) S3method(glimpse,data.frame) S3method(glimpse,default) S3method(glimpse,tbl) -S3method(is_vector_s3,default) S3method(obj_print_data,pillar_vctr) S3method(obj_print_footer,pillar_vctr) S3method(obj_print_header,pillar_vctr) diff --git a/R/deprecated.R b/R/deprecated.R index 1ade2cdaf..7cc5fa794 100644 --- a/R/deprecated.R +++ b/R/deprecated.R @@ -5,25 +5,15 @@ NULL #' is_vector_s3() #' -#' `is_vector_s3()` returns `TRUE` if an object represents an S3 vector. -#' The default implementation forwards to [vctrs::vec_is()]. +#' `is_vector_s3()` forwards to [vctrs::vec_is()]. #' #' @section Lifecycle: -#' `is_vector_s3()` is soft-deprecated, because [vctrs::vec_is()] -#' provides the same functionality based on a robust framework. -#' The generic will remain available for a while but is no longer used. -#' Users and implementers are encouraged to ensure that `vctrs::vec_is()` -#' is `TRUE` for their class. +#' `is_vector_s3()` is soft-deprecated and no longer generic, +#' use [vctrs::vec_is()] instead. #' #' @export #' @rdname deprecated is_vector_s3 <- function(x) { deprecate_soft("1.4.4", "pillar::is_vector_s3()", "vctrs::vec_is()") - - UseMethod("is_vector_s3") -} - -#' @export -is_vector_s3.default <- function(x) { vec_is(x) } diff --git a/man/deprecated.Rd b/man/deprecated.Rd index 381cf2eb5..624f94b14 100644 --- a/man/deprecated.Rd +++ b/man/deprecated.Rd @@ -8,16 +8,12 @@ is_vector_s3(x) } \description{ -\code{is_vector_s3()} returns \code{TRUE} if an object represents an S3 vector. -The default implementation forwards to \code{\link[vctrs:vec_assert]{vctrs::vec_is()}}. +\code{is_vector_s3()} forwards to \code{\link[vctrs:vec_assert]{vctrs::vec_is()}}. } \section{Lifecycle}{ -\code{is_vector_s3()} is soft-deprecated, because \code{\link[vctrs:vec_assert]{vctrs::vec_is()}} -provides the same functionality based on a robust framework. -The generic will remain available for a while but is no longer used. -Users and implementers are encouraged to ensure that \code{vctrs::vec_is()} -is \code{TRUE} for their class. +\code{is_vector_s3()} is soft-deprecated and no longer generic, +use \code{\link[vctrs:vec_assert]{vctrs::vec_is()}} instead. } \keyword{internal}