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.
is.guide()
inherits()
1 parent 91a6d25 commit c850c6dCopy full SHA for c850c6d
R/guides-.R
@@ -68,14 +68,14 @@ NULL
68
#' }
69
guides <- function(...) {
70
args <- list2(...)
71
- if (length(args) > 0) {
72
- if (is.list(args[[1]]) && !is.guide(args[[1]])) args <- args[[1]]
73
- args <- rename_aes(args)
74
# If there are no guides do nothing
75
if (length(args) == 0) {
76
return(NULL)
77
}
78
+ if (is.list(args[[1]]) && !inherits(args[[1]], "guide")) args <- args[[1]]
+ args <- rename_aes(args)
+
79
idx_false <- vapply(args, isFALSE, FUN.VALUE = logical(1L))
80
if (isTRUE(any(idx_false))) {
81
deprecate_warn0("3.3.4", "guides(`<scale>` = 'cannot be `FALSE`. Use \"none\" instead')")
0 commit comments