Skip to content

Commit

Permalink
Remove internal helper that's not used anywhere
Browse files Browse the repository at this point in the history
  • Loading branch information
jennybc authored and jimhester committed Oct 15, 2021
1 parent 4069c0d commit 6e30ec2
Showing 1 changed file with 0 additions and 8 deletions.
8 changes: 0 additions & 8 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -48,14 +48,6 @@ trim_ws <- function(x, which = c("both", "left", "right")) {
mysub("[ \t\r\n]+$", mysub("^[ \t\r\n]+", x))
}

# throws a warning if the argument is not the current directory.
warn_unless_current_dir <- function(pkg, envir = parent.frame()) {
if (pkg != ".") {
warning("`pkg` is not `.`, which is now unsupported.\n Please use `usethis::proj_set()` to set the project directory.", immediate. = TRUE)
usethis::local_project(pkg, quiet = TRUE, .local_envir = envir)
}
}

menu <- function(...) {
utils::menu(...)
}
Expand Down

0 comments on commit 6e30ec2

Please sign in to comment.