Skip to content

Commit

Permalink
docs: Improve ?group_by_prepare (#6999)
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed May 14, 2024
1 parent a155ef1 commit 64f6fcb
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 5 deletions.
4 changes: 2 additions & 2 deletions R/distinct.R
Original file line number Diff line number Diff line change
Expand Up @@ -71,8 +71,8 @@ distinct <- function(.data, ..., .keep_all = FALSE) {



#' Same basic philosophy as group_by_prepare(): lazy_dots comes in, list of data and
#' vars (character vector) comes out.
# Same basic philosophy as group_by_prepare(): lazy_dots comes in, list of data and
# vars (character vector) comes out.
#' @rdname group_by_prepare
#' @export
distinct_prepare <- function(.data,
Expand Down
2 changes: 1 addition & 1 deletion R/group-by.R
Original file line number Diff line number Diff line change
Expand Up @@ -183,7 +183,7 @@ ungroup.data.frame <- function(x, ...) {
x
}

#' Prepare for grouping.
#' Prepare for grouping and other operations
#'
#' `*_prepare()` performs standard manipulation that is needed prior
#' to actual data processing. They are only be needed by packages
Expand Down
3 changes: 1 addition & 2 deletions man/group_by_prepare.Rd

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

0 comments on commit 64f6fcb

Please sign in to comment.