Skip to content

Commit

Permalink
allow generate() without specify() for bootstrapping
Browse files Browse the repository at this point in the history
closes #448
  • Loading branch information
simonpcouch committed Nov 1, 2023
1 parent fa8b970 commit 258d3e7
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 1 deletion.
2 changes: 2 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -6,6 +6,8 @@

* Various improvements to documentation (#501, #504, #508, #512).

* Fixed bug where `generate()` could not be used without first `specify()`ing variables, even in cases where that specification would not affect resampling/simulation (#448).

# infer v1.0.5

* Implemented support for permutation hypothesis tests for paired data via the
Expand Down
2 changes: 1 addition & 1 deletion R/generate.R
Original file line number Diff line number Diff line change
Expand Up @@ -176,7 +176,7 @@ check_permutation_attributes <- function(x, call = caller_env()) {
}

check_cols <- function(x, variables, type, missing, arg_name = "variables", call = caller_env()) {
if (!rlang::is_symbolic(rlang::get_expr(variables))) {
if (!rlang::is_symbolic(rlang::get_expr(variables)) && type == "permute") {
cli_abort(
"The {.arg {arg_name}} argument should be one or more unquoted variable names \\
(not strings in quotation marks).",
Expand Down

0 comments on commit 258d3e7

Please sign in to comment.