Skip to content

Commit 1b8766d

Browse files
committed
trying more options
1 parent fc46a5c commit 1b8766d

6 files changed

+14
-6
lines changed

R/dummy_hash.R

+5-1
Original file line numberDiff line numberDiff line change
@@ -66,11 +66,15 @@
6666
#' @seealso [recipes::step_dummy()]
6767
#' @family Steps for Numeric Variables From Characters
6868
#'
69-
#' @examplesIf rlang::is_installed(c("text2vec", "data.table"))
69+
#' @examplesIf all(c("text2vec", "data.table") %in% rownames(installed.packages()))
7070
#' \dontshow{library(data.table)}
7171
#' \dontshow{data.table::setDTthreads(2)}
7272
#' \dontshow{Sys.setenv("OMP_THREAD_LIMIT" = 2)}
73+
#' \dontshow{Sys.setenv("rsparse_omp_threads" = 1L)}
74+
#' \dontshow{options(rsparse_omp_threads = 1L)}
7375
#' \dontshow{library(text2vec)}
76+
#' \dontshow{Sys.setenv("rsparse_omp_threads" = 1L)}
77+
#' \dontshow{options(rsparse_omp_threads = 1L)}
7478
#' \dontshow{options("text2vec.mc.cores" = 1)}
7579
#'
7680
#' library(recipes)

R/lda.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -32,7 +32,7 @@
3232
#'
3333
#' @family Steps for Numeric Variables From Tokens
3434
#'
35-
#' @examplesIf rlang::is_installed(c("text2vec", "data.table"))
35+
#' @examplesIf all(c("text2vec", "data.table") %in% rownames(installed.packages()))
3636
#' \dontshow{library(data.table)}
3737
#' \dontshow{data.table::setDTthreads(2)}
3838
#' \dontshow{Sys.setenv("OMP_THREAD_LIMIT" = 2)}

R/texthash.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -55,7 +55,7 @@
5555
#' [step_text_normalization()] to perform text normalization.
5656
#' @family Steps for Numeric Variables From Tokens
5757
#'
58-
#' @examplesIf rlang::is_installed(c("text2vec", "data.table"))
58+
#' @examplesIf all(c("text2vec", "data.table") %in% rownames(installed.packages()))
5959
#' \dontshow{library(data.table)}
6060
#' \dontshow{data.table::setDTthreads(2)}
6161
#' \dontshow{Sys.setenv("OMP_THREAD_LIMIT" = 2)}

man/step_dummy_hash.Rd

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

man/step_lda.Rd

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

man/step_texthash.Rd

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

0 commit comments

Comments
 (0)