13 Avoid magical defaults
13.1 What’s the problem?
If a function behaves differently when the default value is suppled explicitly, we say it has a magical default. Magical defaults are best avoided because they make it harder to interpret the function specification.
13.2 What are some examples?
In
data.frame(), the default argument forrow.namesisNULL, but if you supply it directly you get a different result:fun_call(data.frame) #> base::data.frame(..., row.names = NULL, check.rows = FALSE, check.names = TRUE, #> fix.empty.names = TRUE, stringsAsFactors = default.stringsAsFactors()) x <- setNames(nm = letters[1:3]) data.frame(x) #> x #> a a #> b b #> c c data.frame(x, row.names = NULL) #> x #> 1 a #> 2 b #> 3 cIn
hist(), the default value ofxlimisrange(breaks), and the default value forbreaksis"Sturges".range("Sturges")returnsc("Sturges", "Sturges")which doesn’t work when supplied explicitly:fun_call(hist.default) #> graphics::hist.default(x, breaks = "Sturges", freq = NULL, probability = !freq, #> include.lowest = TRUE, right = TRUE, density = NULL, angle = 45, #> col = "lightgray", border = NULL, main = paste("Histogram of", #> xname), xlim = range(breaks), ylim = NULL, xlab = xname, #> ylab, axes = TRUE, plot = TRUE, labels = FALSE, nclass = NULL, #> warn.unused = TRUE, ...) hist(1:10, xlim = c("Sturges", "Sturges")) #> Error in plot.window(xlim, ylim, "", ...): invalid 'xlim' valueIn
Vectorize(), the default argument forvectorize.argsisarg.names, but this variable is defined inside ofVectorize(), so if you supply it explicitly you get an error.fun_call(Vectorize) #> base::Vectorize(FUN, vectorize.args = arg.names, SIMPLIFY = TRUE, #> USE.NAMES = TRUE) Vectorize(rep.int, vectorize.args = arg.names) #> Error in Vectorize(rep.int, vectorize.args = arg.names): object 'arg.names' not foundIn
rbeta(), the default value ofncpis 0, but if you explicitly supply it the function uses a different algorithm:rbeta #> function (n, shape1, shape2, ncp = 0) #> { #> if (missing(ncp)) #> .Call(C_rbeta, n, shape1, shape2) #> else { #> X <- rchisq(n, 2 * shape1, ncp = ncp) #> X/(X + rchisq(n, 2 * shape2)) #> } #> } #> <bytecode: 0x55d2cd238b88> #> <environment: namespace:stats>In
table(), the default value ofdnnislist.names(...); butlist.names()is only defined inside oftable().readr::read_csv()hasprogress = show_progress(), but until version 1.3.1,show_progress()was not exported from the package. That means if you attempted to run it yourself, you’d see an error message:show_progress() #> Error in show_progress(): could not find function "show_progress"In
usethis::use_rmarkdown_template(),template_dirhas the default value oftolower(asciify(template_name)), butasciifyis not exported. That means there’s no way to interactively explore this default value.
13.3 What are the exceptions?
It’s ok to use this behaviour when you want the default value of one argument to be the same as another. For example, take rlang::set_names(), which allows you to create a named vector from two inputs:
fun_call(set_names)
#> rlang::set_names(x, nm = x, ...)
set_names(1:3, letters[1:3])
#> a b c
#> 1 2 3The default value for the names is the vector itself. This provides a convenient shortcut for naming a vector with itself:
set_names(letters[1:3])
#> a b c
#> "a" "b" "c"You can see this same technique in merge(), where all.x and all.y default to the same value as all, and in factor() where labels defaults to the same value as levels.
If you use this technique, make sure that you never use the value of an argument that comes later in the argument list. For example, in file.copy() overwrite defaults to the same value as recursive, but the recursive argument is defined after overwrite:
fun_call(file.copy)
#> base::file.copy(from, to, overwrite = recursive, recursive = FALSE,
#> copy.mode = TRUE, copy.date = FALSE)This makes the defaults arguments harder to understand because you can’t just read from left-to-right.
13.4 What causes the problem?
There are three primary causes:
Overuse of lazy evaluation of default values, which are evaluated in the environment of the function, as described in Advanced R. Here’s a simple example:
f1 <- function(x = y) { y <- trunc(Sys.time(), units = "months") x } y <- 1 f1() #> [1] "2020-09-01 UTC" f1(y) #> [1] 1When
xtakes the valueyfrom its default, it’s evaluated inside the function, yielding1. Whenyis supplied explicitly, it is evaluated in the caller environment, yielding2.Use of
missing()so that the default value is never consulted:f2 <- function(x = 1) { if (missing(x)) { 2 } else { x } } f2() #> [1] 2 f2(1) #> [1] 1In packages, it’s easy to use a non-exported function without thinking about it. This function is available to you, the package author, but not the user of the package, which makes it harder for them to understand how a package works.
13.5 How do I remediate the problem?
This problem is generally easy to avoid for new functions:
Don’t use default values that depend on variables defined inside the function.
Don’t use
missing()4.Don’t use unexported functions.
If you have a made a mistake in an older function you can remediate it by using a NULL default, as described in Chapter 14. If the problem is caused by an unexported function, you can also choose to document and export it.
`%||%` <- function(x, y) if (is.null(x)) y else x
f1_better <- function(x = NULL) {
y <- trunc(Sys.time(), units = "weeks")
x <- x %||% y
x
}
f2_better <- function(x = NULL) {
x <- x %||% 2
x
}This modification should not break existing code, because expands the function interface: all previous code will continue to work, and the function will also work if the argument is passed NULL input (which probably didn’t previously).
For functions like data.frame() where NULL is already a permissible value, you’ll need to use a sentinel object, as described in Section 14.4.3.
sentinel <- function() structure(list(), class = "sentinel")
is_sentinel <- function(x) inherits(x, "sentinel")
data.frame_better <- function(..., row.names = sentinel()) {
if (is_sentinel(row.names)) {
# old default behaviour
}
}