Skip to content

Commit 0d1a503

Browse files
committed
minor formatting
1 parent deefb26 commit 0d1a503

File tree

1 file changed

+15
-15
lines changed

1 file changed

+15
-15
lines changed

R/arguments.R

Lines changed: 15 additions & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -5,15 +5,15 @@ does_it_vary <- function(x) {
55
} else {
66
res <- if(is_quosure(x))
77
isTRUE(all.equal(x[[-1]], quote(varying())))
8-
else
8+
else
99
isTRUE(all.equal(x, quote(varying())))
1010
}
1111
res
1212
}
1313

1414
null_value <- function(x) {
1515
res <- if(is_quosure(x))
16-
isTRUE(all.equal(x[[-1]], quote(NULL))) else
16+
isTRUE(all.equal(x[[-1]], quote(NULL))) else
1717
isTRUE(all.equal(x, NULL))
1818
res
1919
}
@@ -25,15 +25,15 @@ func_calls <- function (f) {
2525
}
2626
else if (is.call(f)) {
2727
fname <- as.character(f[[1]])
28-
if (identical(fname, ".Internal"))
28+
if (identical(fname, ".Internal"))
2929
return(fname)
3030
unique(c(fname, unlist(lapply(f[-1], func_calls), use.names = FALSE)))
3131
}
3232
}
3333

3434
#' A Placeholder Function for Argument Values
35-
#'
36-
#' [varying()] is used when a parameter will be specified at a later date.
35+
#'
36+
#' [varying()] is used when a parameter will be specified at a later date.
3737
#' @export
3838
varying <- function()
3939
quote(varying())
@@ -50,10 +50,10 @@ deharmonize <- function(args, key, engine) {
5050
parse_engine_options <- function(x) {
5151
res <- ll()
5252
if (length(x) >= 2) { # in case of NULL
53-
53+
5454
arg_names <- names(x[[2]])
5555
arg_names <- arg_names[arg_names != ""]
56-
56+
5757
if (length(arg_names) > 0) {
5858
# in case of list()
5959
res <- ll()
@@ -71,11 +71,11 @@ prune_arg_list <- function(x, whitelist = NULL, modified = character(0)) {
7171
nms <- nms[!(nms %in% whitelist)]
7272
for (i in nms) {
7373
if (
74-
is.null(x[[i]]) |
75-
is_null(x[[i]]) |
76-
!(i %in% modified) |
74+
is.null(x[[i]]) |
75+
is_null(x[[i]]) |
76+
!(i %in% modified) |
7777
is_missing(x[[i]])
78-
)
78+
)
7979
x[[i]] <- NULL
8080
}
8181
if(any(names(x) == "..."))
@@ -84,7 +84,7 @@ prune_arg_list <- function(x, whitelist = NULL, modified = character(0)) {
8484
}
8585

8686
check_others <- function(args, x) {
87-
87+
8888
# Make sure that we are not trying to modify an argument that
8989
# is explicitly protected in the method metadata
9090
common_args <- intersect(x$protect, names(args))
@@ -95,16 +95,16 @@ check_others <- function(args, x) {
9595
"and were removed: ",
9696
common_args, call. = FALSE)
9797
}
98-
99-
# If there are not ellipses in function, make sure that the
98+
99+
# If there are not ellipses in function, make sure that the
100100
# args exist in the fit call
101101
if (length(args) > 0 & !x$has_dots) {
102102
o_names <- names(args)
103103
missing_args <- o_names[!(o_names %in% names(x$fit))]
104104
if (length(missing_args) > 0) {
105105
args[o_names %in% missing_args] <- NULL
106106
warning(
107-
"Some argument(s) do not correspond to this function: ",
107+
"Some argument(s) do not correspond to this function: ",
108108
paste0("`", o_names, "`", collapse = ", "),
109109
call. = FALSE
110110
)

0 commit comments

Comments
 (0)