Skip to content

Commit f185e62

Browse files
authored
Update advice in friendly_type() Rd (#1687)
1 parent 25838a8 commit f185e62

File tree

1 file changed

+2
-1
lines changed

1 file changed

+2
-1
lines changed

R/lifecycle-deprecated.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -465,7 +465,8 @@ coerce_class <- function(.x, .to, ...) {
465465
#' `r lifecycle::badge("deprecated")`
466466
#'
467467
#' `friendly_type()` is deprecated. Please use the
468-
#' `standalone-friendly-type.R` file instead.
468+
#' `standalone-obj-type.R` file instead. You can import it
469+
#' in your package with `usethis::use_standalone("r-lib/rlang", "obj-type")`.
469470
#'
470471
#' @param type A type as returned by [typeof()].
471472
#' @return A string of the prettified type, qualified with an

0 commit comments

Comments
 (0)