Skip to content

Commit

Permalink
Be explicit about "base" functions
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Sep 28, 2015
1 parent 06ba083 commit 7edc0a1
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 3 deletions.
2 changes: 1 addition & 1 deletion R/objects.R
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@ splice <- function(...) {

is_not_list <- vapply(dots, negate(is_bare_list), logical(1))
dots[is_not_list] <- lapply(dots[is_not_list], list)
dots %>% flatten() %>% setNames(names)
dots %>% flatten() %>% stats::setNames(names)
}


Expand Down
2 changes: 1 addition & 1 deletion R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -29,7 +29,7 @@ update_list <- function(x, ...) {
eval(f[[2]], x, environment(f))
})

modifyList(x, new_values)
utils::modifyList(x, new_values)
}

as_function <- function(f) {
Expand Down
2 changes: 1 addition & 1 deletion R/zip.R
Original file line number Diff line number Diff line change
Expand Up @@ -41,7 +41,7 @@ zip_n <- function(.x, .fields = NULL, .simplify = FALSE) {
if (is.null(names(.x[[1]]))) {
.fields <- seq_along(.x[[1]])
} else {
.fields <- setNames(names(.x[[1]]), names(.x[[1]]))
.fields <- stats::setNames(names(.x[[1]]), names(.x[[1]]))
}
} else {
if (is.character(.fields) && is.null(names(.fields))) {
Expand Down

0 comments on commit 7edc0a1

Please sign in to comment.