From f42ca1ffdecbc3805e25405fc0b2719fd76568ee Mon Sep 17 00:00:00 2001 From: Hannah Frick Date: Thu, 12 Sep 2024 13:55:49 +0100 Subject: [PATCH] Fix required name --- R/bootci.R | 6 +++--- man/int_pctl.Rd | 6 +++--- 2 files changed, 6 insertions(+), 6 deletions(-) diff --git a/R/bootci.R b/R/bootci.R index 0d13eec8..aa72f318 100644 --- a/R/bootci.R +++ b/R/bootci.R @@ -180,7 +180,7 @@ pctl_single <- function(stats, alpha = 0.05) { #' `term` and `estimate`). Optionally, users can include columns whose names #' begin with a period and the intervals will be created for each combination #' of these variables and the `term` column. For t-intervals, a standard tidy -#' column (usually called `std.err`) is required. See the examples below. +#' column (usually called `std.error`) is required. See the examples below. #' @param alpha Level of significance. #' @param .fn A function to calculate statistic of interest. The #' function should take an `rsplit` as the first argument and the `...` are @@ -238,8 +238,8 @@ pctl_single <- function(stats, alpha = 0.05) { #' tibble( #' term = "corr", #' estimate = cor(dat$sqft, dat$price, method = "spearman"), -#' # don't know the analytical std.err so no t-intervals -#' std.err = NA_real_ +#' # don't know the analytical std.error so no t-intervals +#' std.error = NA_real_ #' ) #' } #' diff --git a/man/int_pctl.Rd b/man/int_pctl.Rd index 7200a6b0..e15434c4 100644 --- a/man/int_pctl.Rd +++ b/man/int_pctl.Rd @@ -36,7 +36,7 @@ estimates. This must be a list column of tidy tibbles (with columns \code{term} and \code{estimate}). Optionally, users can include columns whose names begin with a period and the intervals will be created for each combination of these variables and the \code{term} column. For t-intervals, a standard tidy -column (usually called \code{std.err}) is required. See the examples below.} +column (usually called \code{std.error}) is required. See the examples below.} \item{alpha}{Level of significance.} @@ -98,8 +98,8 @@ rank_corr <- function(split) { tibble( term = "corr", estimate = cor(dat$sqft, dat$price, method = "spearman"), - # don't know the analytical std.err so no t-intervals - std.err = NA_real_ + # don't know the analytical std.error so no t-intervals + std.error = NA_real_ ) }