We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
calls_sys()
1 parent 1088ede commit d764e78Copy full SHA for d764e78
R/utils.R
@@ -93,22 +93,6 @@ is_windows <- function() {
93
identical(.Platform$OS.type, "windows")
94
}
95
96
-#' Invoke a system command
97
-#'
98
-#' Wraps a system command into [shell()] or [system()], depending on the
99
-#' operating system.
100
-#' @param sys_call The call to be executed.
101
-#' @param ... Arguments passed to [shell()] or [system()].
102
-#' @keywords internal
103
-calls_sys <- function(sys_call, ...) {
104
- if (is_windows()) {
105
- error <- shell(sys_call, ...)
106
- } else {
107
- error <- system(sys_call, ...)
108
- }
109
- error
110
-}
111
-
112
#' Get the value of an option
113
#'
114
#' Basically a `getOptions()` that fails fast by default.
man/calls_sys.Rd
0 commit comments