Skip to content

Commit

Permalink
Supersede rather than deprecate do()
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Mar 6, 2020
1 parent 1433545 commit 33eb4d9
Show file tree
Hide file tree
Showing 3 changed files with 5 additions and 10 deletions.
3 changes: 1 addition & 2 deletions NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -193,8 +193,7 @@

* `combine()` is soft deprecated. Please use `vctrs::vec_c()` instead.

* `do()` is deprecated in favour of either `condense()` or `summarise()`
depending on whether you were using the named or unnamed form.
* `do()` is superseded in favour of `summarise()`.

* `failwith()`, deprecated in dplyr 0.7.0, is now defunct.

Expand Down
8 changes: 2 additions & 6 deletions R/deprec-do.r
Original file line number Diff line number Diff line change
@@ -1,9 +1,9 @@
#' Do anything
#'
#' @description
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("deprecated")}
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#'
#' `do()` is deprecated as of dplyr 1.0.0, because its syntax never really
#' `do()` is superseded as of dplyr 1.0.0, because its syntax never really
#' felt like it belong with the rest of dplyr. It's replaced by a combination
#' of [summarise()] (which can now produce multiple rows and multiple columns),
#' [condense()] (which creates a [rowwise] tibble containing list-columns),
Expand Down Expand Up @@ -46,10 +46,6 @@
#' models %>% summarise(broom::tidy(mod))
#' }
do <- function(.data, ...) {
lifecycle::deprecate_warn("1.0.0", "do()",
details = "Use condense() or summarise()"
)

UseMethod("do")
}

Expand Down
4 changes: 2 additions & 2 deletions man/do.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 33eb4d9

Please sign in to comment.