You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
The fill = NULL argument does not appear to work in the shade_confidence_interval() function. It still produces a shaded interval even when fill is set to NULL.
Reproducible example
library(tidyverse)
library(tidymodels)
# find the point estimate---mean number of hours worked per weekpoint_estimate<-gss %>%
specify(response=hours) %>%
calculate(stat="mean")
# ...and a bootstrap distributionboot_dist<-gss %>%
# ...we're interested in the number of hours worked per week
specify(response=hours) %>%
# generating data points
generate(reps=1000, type="bootstrap") %>%
# finding the distribution from the generated data
calculate(stat="mean")
# find a confidence interval around the point estimateci<-boot_dist %>%
get_confidence_interval(point_estimate=point_estimate,
# at the 95% confidence levellevel=.95,
# using the standard error methodtype="se")
# and plot it!boot_dist %>%
visualize() +
shade_confidence_interval(ci)
# or just plot the boundsboot_dist %>%
visualize() +
shade_confidence_interval(ci, fill=NULL)
Uh oh!
There was an error while loading. Please reload this page.
The problem
The
fill = NULL
argument does not appear to work in theshade_confidence_interval()
function. It still produces a shaded interval even when fill is set to NULL.Reproducible example
Created on 2024-03-08 with reprex v2.1.0
Session info
The text was updated successfully, but these errors were encountered: