Skip to content

Commit

Permalink
feat: Revert as_data_frame() now also refers to as.data.frame() i…
Browse files Browse the repository at this point in the history
…n its deprecation message

Revert "Merge pull request #1504 from tidyverse/f-1202-as-row-names"

This reverts commit 83e6178, reversing
changes made to 21729a3.
  • Loading branch information
krlmlr committed Feb 22, 2023
1 parent 0abecc1 commit 4a2cd6e
Show file tree
Hide file tree
Showing 8 changed files with 7 additions and 2,297 deletions.
2 changes: 0 additions & 2 deletions NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -10,8 +10,6 @@

- `as_data_frame()` now also refers to `as.data.frame()` in its deprecation message (#1149, #1506).

- `as.data.frame.tbl_df()` supports a character vector in the `row.names` argument (#1202, #1504).

## Chore

- Retry continuous benchmarks until success (#1505).
Expand Down
10 changes: 0 additions & 10 deletions R/rownames.R
Original file line number Diff line number Diff line change
Expand Up @@ -122,13 +122,3 @@ raw_rownames <- function(x) {
abort_already_has_rownames <- function() {
tibble_abort("`.data` must be a data frame without row names.")
}

abort_character_rownames <- function() {
tibble_abort("`row.names` must be a character vector.")
}

abort_inconsistent_rownames <- function(bad, nrow) {
tibble_abort(paste0(
"`row.names` must have length ", nrow, ", not ", bad, "."
))
}
9 changes: 0 additions & 9 deletions R/tbl_df.R
Original file line number Diff line number Diff line change
Expand Up @@ -74,15 +74,6 @@ as.data.frame.tbl_df <- function(x, row.names = NULL, optional = FALSE, ...) {
unname <- which(!map_lgl(x, is_bare_list))
x[unname] <- map(.subset(x, unname), vectbl_set_names, NULL)
class(x) <- "data.frame"
if (!is.null(row.names)) {
if (!is_bare_character(row.names)) {
abort_character_rownames()
}
if (length(row.names) != nrow(x)) {
abort_inconsistent_rownames(length(row.names), nrow(x))
}
attr(x, "row.names") <- row.names
}
x
}

Expand Down
55 changes: 3 additions & 52 deletions revdep/README.md
Original file line number Diff line number Diff line change
@@ -1,58 +1,9 @@
# Revdeps

## Failed to check (41)
## New problems (2)

|package |version |error |warning |note |
|:-------------|:-------|:-----|:-------|:----|
|NA |? | | | |
|beadplexr |? | | | |
|cinaR |? | | | |
|NA |? | | | |
|ctsem |3.7.2 |1 | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|FAMetA |0.1.5 |1 | | |
|NA |? | | | |
|genekitr |? | | | |
|ggPMX |? | | | |
|immcp |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|loon.tourr |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|nlmixr2rpt |? | | | |
|numbat |? | | | |
|NA |? | | | |
|OlinkAnalyze |? | | | |
|NA |? | | | |
|NA |? | | | |
|Platypus |? | | | |
|NA |? | | | |
|NA |? | | | |
|RVA |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|NA |? | | | |
|tinyarray |? | | | |
|vivid |? | | | |
|NA |? | | | |
|xpose.nlmixr2 |? | | | |

## New problems (5)

|package |version |error |warning |note |
|:------------|:-------|:------|:-------|:----|
|[bibliometrix](problems.md#bibliometrix)|4.1.1 |__+1__ | | |
|[ggdag](problems.md#ggdag)|0.2.7 |__+2__ | | |
|package |version |error |warning |note |
|:-------|:-------|:------|:-------|:----|
|[ggESDA](problems.md#ggesda)|0.2.0 |__+1__ |__+1__ | |
|[PUMP](problems.md#pump)|1.0.1 |__+1__ |__+1__ | |
|[RSDA](problems.md#rsda)|3.0.13 |__+1__ |__+1__ | |

35 changes: 3 additions & 32 deletions revdep/cran.md
Original file line number Diff line number Diff line change
@@ -1,49 +1,20 @@
## revdepcheck results

We checked 3485 reverse dependencies (3460 from CRAN + 25 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package.
We checked 5 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package.

* We saw 5 new problems
* We failed to check 16 packages
* We saw 2 new problems
* We failed to check 0 packages

Issues with CRAN packages are summarised below.

### New problems
(This reports the first line of each new failure)

* bibliometrix
checking examples ... ERROR

* ggdag
checking examples ... ERROR
checking tests ... ERROR

* ggESDA
checking examples ... ERROR
checking re-building of vignette outputs ... WARNING

* PUMP
checking examples ... ERROR
checking re-building of vignette outputs ... WARNING

* RSDA
checking examples ... ERROR
checking re-building of vignette outputs ... WARNING

### Failed to check

* beadplexr (NA)
* cinaR (NA)
* ctsem (NA)
* FAMetA (NA)
* genekitr (NA)
* ggPMX (NA)
* immcp (NA)
* loon.tourr (NA)
* nlmixr2rpt (NA)
* numbat (NA)
* OlinkAnalyze (NA)
* Platypus (NA)
* RVA (NA)
* tinyarray (NA)
* vivid (NA)
* xpose.nlmixr2 (NA)
Loading

0 comments on commit 4a2cd6e

Please sign in to comment.