Skip to content

Commit

Permalink
Remove unused internal utility: calls_sys()
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed May 19, 2024
1 parent 1088ede commit d764e78
Show file tree
Hide file tree
Showing 2 changed files with 0 additions and 34 deletions.
16 changes: 0 additions & 16 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -93,22 +93,6 @@ is_windows <- function() {
identical(.Platform$OS.type, "windows")
}

#' Invoke a system command
#'
#' Wraps a system command into [shell()] or [system()], depending on the
#' operating system.
#' @param sys_call The call to be executed.
#' @param ... Arguments passed to [shell()] or [system()].
#' @keywords internal
calls_sys <- function(sys_call, ...) {
if (is_windows()) {
error <- shell(sys_call, ...)
} else {
error <- system(sys_call, ...)
}
error
}

#' Get the value of an option
#'
#' Basically a `getOptions()` that fails fast by default.
Expand Down
18 changes: 0 additions & 18 deletions man/calls_sys.Rd

This file was deleted.

0 comments on commit d764e78

Please sign in to comment.