Skip to content

Commit

Permalink
Move past deprecate_stop() call
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Dec 19, 2023
1 parent b5058b8 commit 9a6911b
Showing 1 changed file with 4 additions and 4 deletions.
8 changes: 4 additions & 4 deletions R/as_tibble.R
Original file line number Diff line number Diff line change
Expand Up @@ -70,14 +70,14 @@ as_tibble.data.frame <- function(x, validate = NULL, ...,
.rows = NULL,
.name_repair = c("check_unique", "unique", "universal", "minimal"),
rownames = pkgconfig::get_config("tibble::rownames", NULL)) {
if (!inherits(x, "tbl_df") && !identical(class(x), "data.frame")) {
x <- as.data.frame(x)
}

if (!is.null(validate)) {
deprecate_stop("2.0.0", "tibble::as_tibble(validate = )", "as_tibble(.name_repair =)")
}

if (!inherits(x, "tbl_df") && !identical(class(x), "data.frame")) {
x <- as.data.frame(x)
}

old_rownames <- raw_rownames(x)
if (is.null(.rows)) {
.rows <- nrow(x)
Expand Down

0 comments on commit 9a6911b

Please sign in to comment.