Skip to content

Commit

Permalink
Merge pull request #4085 from yutannihilation/doc/fix-lifecycle-badge
Browse files Browse the repository at this point in the history
Display lifecycle badges correctly
  • Loading branch information
romainfrancois authored Jan 7, 2019
2 parents b3a39d3 + c9dab67 commit ce7f2bc
Show file tree
Hide file tree
Showing 30 changed files with 23 additions and 50 deletions.
1 change: 1 addition & 0 deletions .travis.yml
Original file line number Diff line number Diff line change
Expand Up @@ -6,6 +6,7 @@ dist: trusty
cache: packages
latex: false
fortran: false
r_build_args: '--no-manual'

jobs:
include:
Expand Down
4 changes: 1 addition & 3 deletions R/bind.r
Original file line number Diff line number Diff line change
Expand Up @@ -132,9 +132,7 @@ bind_cols <- function(...) {

#' Combine vectors
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("questioning")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("questioning")}
#'
#' @description
#' `combine()` acts like [c()] or
Expand Down
4 changes: 1 addition & 3 deletions R/colwise-mutate.R
Original file line number Diff line number Diff line change
Expand Up @@ -327,9 +327,7 @@ manip_apply_syms <- function(funs, syms, tbl) {

#' Summarise and mutate multiple columns.
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("deprecated")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("deprecated")}
#'
#' @description
#'
Expand Down
4 changes: 1 addition & 3 deletions R/do.r
Original file line number Diff line number Diff line change
@@ -1,8 +1,6 @@
#' Do anything
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("questioning")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("questioning")}
#'
#' @description This is a general purpose complement to the specialised
#' manipulation functions [filter()], [select()], [mutate()],
Expand Down
4 changes: 1 addition & 3 deletions R/funs.R
Original file line number Diff line number Diff line change
@@ -1,8 +1,6 @@
#' Create a list of functions calls.
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("softdeprecated")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("soft-deprecated")}
#'
#' @description
#'
Expand Down
4 changes: 1 addition & 3 deletions R/group_map.R
Original file line number Diff line number Diff line change
@@ -1,9 +1,7 @@

#' Apply a function to each group
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("experimental")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("experimental")}
#'
#' @description
#'
Expand Down
4 changes: 1 addition & 3 deletions R/group_nest.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,9 +5,7 @@ group_nest_impl <- function(.tbl, .key, keep = FALSE){

#' Nest a tibble using a grouping specification
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("experimental")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("experimental")}
#'
#' @family grouping functions
#'
Expand Down
4 changes: 1 addition & 3 deletions R/group_split.R
Original file line number Diff line number Diff line change
@@ -1,8 +1,6 @@
#' Split data frame by groups
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("experimental")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("experimental")}
#'
#' @family grouping functions
#'
Expand Down
4 changes: 1 addition & 3 deletions R/group_trim.R
Original file line number Diff line number Diff line change
@@ -1,8 +1,6 @@
#' Trim grouping structure
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("experimental")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("experimental")}
#'
#' @family grouping functions
#'
Expand Down
4 changes: 1 addition & 3 deletions R/reexport-tidyselect.R
Original file line number Diff line number Diff line change
Expand Up @@ -33,9 +33,7 @@ tidyselect::last_col

#' Select variables
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("deprecated")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("deprecated")}
#'
#' @description
#'
Expand Down
4 changes: 1 addition & 3 deletions R/rowwise.r
Original file line number Diff line number Diff line change
@@ -1,8 +1,6 @@
#' Group input by rows
#'
#' ```
#' \Sexpr[results=rd, stage=render]{mypkg:::lifecycle("questioning")}
#' ```
#' \Sexpr[results=rd, stage=render]{dplyr:::lifecycle("questioning")}
#'
#' See [this repository](https://github.com/jennybc/row-oriented-workflows)
#' for alternative ways to perform row-wise operations
Expand Down
3 changes: 1 addition & 2 deletions man/combine.Rd

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

3 changes: 1 addition & 2 deletions man/do.Rd

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

1 change: 1 addition & 0 deletions man/figures/lifecycle-archived.svg
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
File renamed without changes
File renamed without changes
File renamed without changes
File renamed without changes
File renamed without changes
1 change: 1 addition & 0 deletions man/figures/lifecycle-retired.svg
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
File renamed without changes
File renamed without changes
3 changes: 1 addition & 2 deletions man/funs.Rd

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

3 changes: 1 addition & 2 deletions man/group_map.Rd

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

3 changes: 1 addition & 2 deletions man/group_nest.Rd

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

3 changes: 1 addition & 2 deletions man/group_split.Rd

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

3 changes: 1 addition & 2 deletions man/group_trim.Rd

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

3 changes: 1 addition & 2 deletions man/rowwise.Rd

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

3 changes: 1 addition & 2 deletions man/select_vars.Rd

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

3 changes: 1 addition & 2 deletions man/summarise_each.Rd

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

0 comments on commit ce7f2bc

Please sign in to comment.