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.
has_name()
1 parent 2e9b8c2 commit 0cca7a3Copy full SHA for 0cca7a3
R/limits.R
@@ -80,7 +80,7 @@
80
lims <- function(...) {
81
args <- list2(...)
82
83
- if (!all(has_name(args))) {
+ if (!is_named2(args)) {
84
cli::cli_abort("All arguments must be named.")
85
}
86
env <- current_env()
R/utilities.R
@@ -231,15 +231,6 @@ gg_dep <- function(version, msg) {
231
invisible()
232
233
234
-has_name <- function(x) {
235
- nms <- names(x)
236
- if (is.null(nms)) {
237
- return(rep(FALSE, length(x)))
238
- }
239
-
240
- !is.na(nms) & nms != ""
241
-}
242
243
# Use chartr() for safety since toupper() fails to convert i to I in Turkish locale
244
lower_ascii <- "abcdefghijklmnopqrstuvwxyz"
245
upper_ascii <- "ABCDEFGHIJKLMNOPQRSTUVWXYZ"
0 commit comments