Skip to content

Commit dd46f7f

Browse files
committed
fill in missing se
1 parent 9f2b8ba commit dd46f7f

File tree

1 file changed

+2
-0
lines changed

1 file changed

+2
-0
lines changed

R/geom-smooth.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -123,6 +123,8 @@ geom_smooth <- function(mapping = NULL, data = NULL,
123123
GeomSmooth <- ggproto("GeomSmooth", Geom,
124124
setup_params = function(data, params) {
125125
params$flipped_aes <- has_flipped_aes(data, params, range_is_orthogonal = TRUE, ambiguous = TRUE)
126+
params$se <- params$se %||%
127+
all(c("ymin", "ymax") %in% names(data))
126128
params
127129
},
128130

0 commit comments

Comments
 (0)