Skip to content

Commit

Permalink
fix checks
Browse files Browse the repository at this point in the history
  • Loading branch information
abichat committed Mar 6, 2024
1 parent e5c63c2 commit fa30fc7
Show file tree
Hide file tree
Showing 3 changed files with 16 additions and 2 deletions.
2 changes: 2 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -39,6 +39,7 @@ export(step_select_kruskal)
export(step_select_wilcoxon)
export(var_to_keep)
importFrom(dplyr,filter)
importFrom(dplyr,if_else)
importFrom(dplyr,left_join)
importFrom(dplyr,mutate)
importFrom(dplyr,pull)
Expand All @@ -56,6 +57,7 @@ importFrom(recipes,recipes_eval_select)
importFrom(recipes,sel2char)
importFrom(recipes,step)
importFrom(rlang,.data)
importFrom(rlang,.env)
importFrom(rlang,abort)
importFrom(rlang,enquos)
importFrom(stats,as.formula)
Expand Down
6 changes: 4 additions & 2 deletions R/aggregate_list.R
Original file line number Diff line number Diff line change
Expand Up @@ -107,8 +107,9 @@ step_aggregate_list_new <- function(terms, role, trained,
}

#' @export
#' @importFrom dplyr left_join
#' @importFrom dplyr if_else left_join
#' @importFrom recipes recipes_eval_select
#' @importFrom rlang .data .env
#' @importFrom tibble enframe tibble
#' @importFrom tidyr unnest_longer
prep.step_aggregate_list <- function(x, training, info = NULL, ...) {
Expand All @@ -131,7 +132,8 @@ prep.step_aggregate_list <- function(x, training, info = NULL, ...) {
asis <- setdiff(col_names, unlist(x$list_agg))
res_agg_list <-
res_agg_list %>%
mutate(aggregate = if_else(terms %in% asis, terms, aggregate))
mutate(aggregate = if_else(.data$terms %in% .env$asis,
.data$terms, .data$aggregate))
}

step_aggregate_list_new(
Expand Down
10 changes: 10 additions & 0 deletions man/step_aggregate_list.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit fa30fc7

Please sign in to comment.