Skip to content

Commit

Permalink
Life cycle -> Lifecycle
Browse files Browse the repository at this point in the history
  • Loading branch information
DavisVaughan committed Jan 26, 2023
1 parent c4c8455 commit b4f9224
Show file tree
Hide file tree
Showing 9 changed files with 10 additions and 10 deletions.
4 changes: 2 additions & 2 deletions R/colwise-mutate.R
Original file line number Diff line number Diff line change
Expand Up @@ -75,7 +75,7 @@
#'
#' Name collisions in the new columns are disambiguated using a unique suffix.
#'
#' @section Life cycle:
#' @section Lifecycle:
#'
#' The functions are maturing, because the naming scheme and the
#' disambiguation algorithm are subject to change in dplyr 0.9.0.
Expand Down Expand Up @@ -196,7 +196,7 @@ summarize_at <- summarise_at
#' `transmute_if()`.
#'
#' @inheritSection summarise_all Naming
#' @inheritSection summarise_all Life cycle
#' @inheritSection summarise_all Lifecycle
#'
#' @examples
#' iris <- as_tibble(iris)
Expand Down
2 changes: 1 addition & 1 deletion R/group-nest.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ group_nest_impl <- function(.tbl, .key, keep = FALSE){
#'
#' Nest a tibble using a grouping specification
#'
#' @section Life cycle:
#' @section Lifecycle:
#' `group_nest()` is not stable because [`tidyr::nest(.by =)`][tidyr::nest()]
#' provides very similar behavior. It may be deprecated in the future.
#'
Expand Down
2 changes: 1 addition & 1 deletion R/group-split.R
Original file line number Diff line number Diff line change
Expand Up @@ -17,7 +17,7 @@
#' is generally not very useful as you want have easy access to the group
#' metadata.
#'
#' @section Life cycle:
#' @section Lifecycle:
#' `group_split()` is not stable because you can achieve very similar results by
#' manipulating the nested column returned from
#' [`tidyr::nest(.by =)`][tidyr::nest()]. That also retains the group keys all
Expand Down
2 changes: 1 addition & 1 deletion R/nest-by.R
Original file line number Diff line number Diff line change
Expand Up @@ -30,7 +30,7 @@
#' reframe(data)
#' ```
#'
#' @section Life cycle:
#' @section Lifecycle:
#' `nest_by()` is not stable because [`tidyr::nest(.by =)`][tidyr::nest()]
#' provides very similar behavior. It may be deprecated in the future.
#'
Expand Down
2 changes: 1 addition & 1 deletion man/group_nest.Rd

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

2 changes: 1 addition & 1 deletion man/group_split.Rd

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

2 changes: 1 addition & 1 deletion man/mutate_all.Rd

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

2 changes: 1 addition & 1 deletion man/nest_by.Rd

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

2 changes: 1 addition & 1 deletion man/summarise_all.Rd

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

0 comments on commit b4f9224

Please sign in to comment.