Skip to content

Commit

Permalink
Provide alias for deprecated map_rows()
Browse files Browse the repository at this point in the history
  • Loading branch information
lionel- committed Dec 29, 2015
1 parent 13ba73a commit e1b66af
Show file tree
Hide file tree
Showing 3 changed files with 11 additions and 0 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -98,6 +98,7 @@ export(map_if)
export(map_int)
export(map_lgl)
export(map_n)
export(map_rows)
export(negate)
export(order_by)
export(partial)
Expand Down
9 changes: 9 additions & 0 deletions R/rows.R
Original file line number Diff line number Diff line change
Expand Up @@ -214,6 +214,15 @@ invoke_rows <- function(.f, .d, ..., .collate = c("list", "rows", "cols"),
.Call(invoke_rows_impl, environment(), ".d", ".f")
}

#' @export
#' @usage NULL
#' @rdname by_row
map_rows <- function(.d, .f, ..., .labels = TRUE) {
warning("`map_rows()` is deprecated; please use `invoke_rows()` instead.",
call. = FALSE)
invoke_rows(.f, .d, ..., .labels = .labels)
}


#' Slice a data frame into groups of rows
#'
Expand Down
1 change: 1 addition & 0 deletions man/by_row.Rd

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

0 comments on commit e1b66af

Please sign in to comment.