Skip to content

Commit

Permalink
Only methods
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Apr 18, 2024
1 parent 67b0b9b commit ab7a247
Showing 1 changed file with 16 additions and 1 deletion.
17 changes: 16 additions & 1 deletion R/zzz.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,22 @@
.onLoad <- function(libname, pkgname) {
if (Sys.getenv("COLLECTOR_PATH") != "") {
dir.create(Sys.getenv("COLLECTOR_PATH"), recursive = TRUE, showWarnings = FALSE)
collector::set_collector(path = Sys.getenv("COLLECTOR_PATH"))
collector::set_collector(
funs = c(
"add_count", "anti_join", "arrange", "auto_copy", "collect",
"compute", "count", "cross_join", "distinct", "do", "explain",
"full_join", "group_by", "group_indices", "group_keys", "group_map",
"group_modify", "group_nest", "group_size", "group_split", "group_trim",
"group_vars", "groups", "head", "inner_join", "intersect", "left_join",
"mutate", "n_groups", "nest_by", "nest_join", "print", "pull",
"reframe", "relocate", "rename", "rename_with", "right_join",
"rows_append", "rows_delete", "rows_insert", "rows_patch", "rows_update",
"rows_upsert", "rowwise", "select", "semi_join", "setdiff", "setequal",
"slice", "slice_head", "slice_sample", "slice_tail", "summarise",
"symdiff", "transmute", "ungroup", "union", "union_all"
),
path = Sys.getenv("COLLECTOR_PATH")
)
}

ns_dplyr <- ns_env(pkgname)
Expand Down

0 comments on commit ab7a247

Please sign in to comment.