Skip to content

dplyr 1.2.0 reverse dependency issues #7763

@DavisVaughan

Description

@DavisVaughan

Missing export: dplyr::id

Packages using dplyr::id which is not exported. These packages get "no visible binding for global variable 'id'" errors.

Hi there, we are working on dplyr 1.2.0 and your package was flagged in our reverse dependency checks due to our removal of `dplyr::id()`.

Your package does one of two things:

- It re-exports `dplyr::id()`, which has been defunct for many years and has now been removed from dplyr.

- It references a column named `id`, likely in a `mutate()` or `summarise()`, but does not note this as a global variable with `utils::globalVariables("id")`. In this case, you got lucky that dplyr exported `id()`, meaning that you did not need a global variable for `"id"`. Since we have removed `dplyr::id()`, your package will need this now.

You'll need to update your package to stay on CRAN. We are still working on dplyr 1.2.0, but consider this an (at minimum) 2 week notice!

Defunct function: tbl_df() / as.tbl()

Packages using tbl_df() or as.tbl() which were deprecated in dplyr 1.0.0 and are now defunct. Need to use tibble::as_tibble() instead.

Hi there, we are working on dplyr 1.2.0 and your package was flagged in our reverse dependency checks due to advancing our deprecation of `dplyr::as.tbl()` and `dplyr::tbl_df()`, both of which have been deprecated since dplyr 1.0.0 in 2020.

You'll need to update your package to use `tibble::as_tibble()` instead to stay on CRAN.

We are still working on dplyr 1.2.0, but you can consider this an (at minimum) 2 week notice!

Defunct function: combine()

Packages using combine() which was deprecated in dplyr 1.0.0 and is now defunct. Need to use vctrs::vec_c() instead.

Defunct function: add_rownames()

Packages using add_rownames() which was deprecated in dplyr 1.0.0 and is now defunct. Need to use tibble::rownames_to_column() instead.

Defunct argument: group_by(.dots = )

Packages using the .dots argument of group_by() which was deprecated in dplyr 1.0.0 and is now defunct.

Defunct argument: group_by(add = )

Packages using the add argument of group_by() which was deprecated in dplyr 1.0.0 and is now defunct. Need to use .add argument instead.

Defunct argument: group_indices(...)

Packages using the ... argument of group_indices() which was deprecated in dplyr 1.0.0 and is now defunct. Need to call group_by() first.

Defunct argument: add_count(.drop = )

Packages using the .drop argument of add_count() which was deprecated in dplyr 1.0.0 and is now defunct.

Missing export: dplyr::select_vars / dplyr::rename_vars

Packages using select_vars or rename_vars which are not exported. Need to migrate to tidyselect functions.

Missing export: dplyr::location

Packages using dplyr::location which is not exported.

Hi there, we are working on dplyr 1.2.0 and your package was flagged in our reverse dependency checks due to our removal of `dplyr::location()`.

Your package does one of two things:

- It re-exports `dplyr::location()`, which has been defunct for many years and has now been removed from dplyr.

- It references a column named `location`, likely in a `mutate()` or `summarise()`, but does not note this as a global variable with `utils::globalVariables("location")`. In this case, you got lucky that dplyr exported `location()`, meaning that you did not need a global variable for `"location"`. Since we have removed `dplyr::location()`, your package will need this now.

You'll need to update your package to stay on CRAN. We are still working on dplyr 1.2.0, but consider this an (at minimum) 2 week notice!

case_when() type incompatibility with .default

vctrs bug, will fix

Packages with case_when() errors where the type of condition results don't match the .default type. Need to ensure all branches return the same type.

case_when() named vector issues

vctrs bug, will fix

Packages with case_when() errors about merging outer names with vectors of length > 1.

case_when() deprecated pattern (scalar LHS with vector RHS)

Packages using the deprecated pattern of case_when() with size 1 LHS inputs and size >1 RHS inputs. Should use if-else statements instead.

if_else() stricter validation

Packages where if_else() now rejects array conditions, requiring logical vectors.

Missing purrr export: at_depth

Packages using purrr::at_depth which is not exported. Not a dplyr issue but affects installation.

Missing Rd cross-references to removed functions

Packages with documentation cross-references to removed dplyr functions like src_dbi(), src_postgres(), src_mysql().

Missing NEWS entries

Packages that fail because dplyr NEWS entries are missing for the development version.

ggplot2 dependency issues

Packages failing due to ggplot2/ggtern compatibility issues. Not a dplyr issue.

C++ compilation failures (memory exhaustion)

Stan-based packages that fail C++ compilation due to memory exhaustion. Not dplyr-related.

Missing dependencies (non-dplyr)

Packages with missing dependencies unrelated to dplyr.

Rust/Cargo compilation issues

Packages with Rust compilation errors. Not dplyr-related.

Other issues requiring investigation

Packages with various other errors that need further analysis or have unclear error patterns.

Passed checks or unclear status

Packages that passed checks, had empty error output, or status is unclear.

  • CytoML, unable to install, "No such file or directory"
  • DSMolgenisArmadillo, dependency ‘panelaggregation’ not available, archived 2025-06-13
  • dsTidyverse, dependency ‘panelaggregation’ not available, archived 2025-06-13
  • dsTidyverseClient, dependency ‘panelaggregation’ not available, archived 2025-06-13
  • flowWorkspace, unable to install, "No such file or directory". Bioconductor.
  • NanoMethViz, unable to install, "No such file or directory". Bioconductor. C++20?
  • pkgstats, unable to install, "No such file or directory". Archived package.
  • quanteda, didn't run new checks at all. not sure why.

Metadata

Metadata

Assignees

No one assigned

    Labels

    No labels
    No labels

    Type

    No type

    Projects

    No projects

    Milestone

    No milestone

    Relationships

    None yet

    Development

    No branches or pull requests

    Issue actions