Skip to content

Commit 56ba1a8

Browse files
authored
Merge pull request #535 from tidymodels/fix-533
Fix required name for standard error column for `int_t()`
2 parents 617b619 + f42ca1f commit 56ba1a8

File tree

2 files changed

+6
-6
lines changed

2 files changed

+6
-6
lines changed

R/bootci.R

+3-3
Original file line numberDiff line numberDiff line change
@@ -180,7 +180,7 @@ pctl_single <- function(stats, alpha = 0.05) {
180180
#' `term` and `estimate`). Optionally, users can include columns whose names
181181
#' begin with a period and the intervals will be created for each combination
182182
#' of these variables and the `term` column. For t-intervals, a standard tidy
183-
#' column (usually called `std.err`) is required. See the examples below.
183+
#' column (usually called `std.error`) is required. See the examples below.
184184
#' @param alpha Level of significance.
185185
#' @param .fn A function to calculate statistic of interest. The
186186
#' function should take an `rsplit` as the first argument and the `...` are
@@ -238,8 +238,8 @@ pctl_single <- function(stats, alpha = 0.05) {
238238
#' tibble(
239239
#' term = "corr",
240240
#' estimate = cor(dat$sqft, dat$price, method = "spearman"),
241-
#' # don't know the analytical std.err so no t-intervals
242-
#' std.err = NA_real_
241+
#' # don't know the analytical std.error so no t-intervals
242+
#' std.error = NA_real_
243243
#' )
244244
#' }
245245
#'

man/int_pctl.Rd

+3-3
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)