@@ -92,7 +92,7 @@ scale_colour_continuous <- function(..., palette = NULL, aesthetics = "colour",
92
92
93
93
has_old_args <- any(names(enexprs(... )) %in% c(" low" , " high" ))
94
94
95
- if (has_old_args || ! is.null(type ) && is.null(palette )) {
95
+ if (has_old_args || ( ! is.null(type ) && is.null(palette ) )) {
96
96
scale <- scale_backward_compatibility(
97
97
... , guide = guide , na.value = na.value , scale = type ,
98
98
aesthetic = " colour" , type = " continuous"
@@ -114,7 +114,7 @@ scale_fill_continuous <- function(..., palette = NULL, aesthetics = "fill", guid
114
114
115
115
has_old_args <- any(names(enexprs(... )) %in% c(" low" , " high" ))
116
116
117
- if (has_old_args || ! is.null(type ) && is.null(palette )) {
117
+ if (has_old_args || ( ! is.null(type ) && is.null(palette ) )) {
118
118
scale <- scale_backward_compatibility(
119
119
... , guide = guide , na.value = na.value , scale = type ,
120
120
aesthetic = " fill" , type = " continuous"
@@ -136,7 +136,7 @@ scale_colour_binned <- function(..., palette = NULL, aesthetics = "colour", guid
136
136
137
137
has_old_args <- any(names(enexprs(... )) %in% c(" low" , " high" ))
138
138
139
- if (has_old_args || ! is.null(type ) && is.null(palette )) {
139
+ if (has_old_args || ( ! is.null(type ) && is.null(palette ) )) {
140
140
scale <- scale_backward_compatibility(
141
141
... , guide = guide , na.value = na.value , scale = type ,
142
142
aesthetic = " colour" , type = " binned"
@@ -157,7 +157,7 @@ scale_fill_binned <- function(..., palette = NULL, aesthetics = "fill", guide =
157
157
type = getOption(" ggplot2.binned.fill" )) {
158
158
has_old_args <- any(names(enexprs(... )) %in% c(" low" , " high" ))
159
159
160
- if (has_old_args || ! is.null(type ) && is.null(palette )) {
160
+ if (has_old_args || ( ! is.null(type ) && is.null(palette ) )) {
161
161
scale <- scale_backward_compatibility(
162
162
... , guide = guide , na.value = na.value , scale = type ,
163
163
aesthetic = " fill" , type = " binned"
0 commit comments