Skip to content

Commit 643bca3

Browse files
committed
talk about conda and virtualenv on docs
1 parent 24ea18e commit 643bca3

File tree

2 files changed

+9
-3
lines changed

2 files changed

+9
-3
lines changed

R/preprocessing.R

Lines changed: 6 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -892,7 +892,9 @@ flow_images_from_directory <- function(
892892
#' same environment as `tensorflow` and `keras`.
893893
#'
894894
#' If you are using `r-tensorflow` (the default environment) you can install
895-
#' `pandas` by running `reticulate::py_install("pandas", envname = "r-tensorflow")`.
895+
#' `pandas` by running `reticulate::virtualenv_install("pandas", envname = "r-tensorflow")`
896+
#' or `reticulate::conda_install("pandas", envname = "r-tensorflow")` depending on
897+
#' the kind of environment you are using.
896898
#'
897899
#' @section Yields: `(x, y)` where `x` is an array of image data and `y` is a
898900
#' array of corresponding labels. The generator loops indefinitely.
@@ -909,7 +911,9 @@ flow_images_from_dataframe <- function(
909911

910912
if (!reticulate::py_module_available("pandas"))
911913
stop("Pandas (python module) must be installed in the same environment as Keras.",
912-
'. Install it using reticulate::py_install("pandas", envname = "r-tensorflow").')
914+
'Install it using reticulate::virtualenv_install("pandas", envname = "r-tensorflow") ',
915+
'or reticulate::conda_install("pandas", envname = "r-tensorflow") depending on ',
916+
'the kind of environment you are using.')
913917

914918
args <- list(
915919
dataframe = as.data.frame(dataframe),

man/flow_images_from_dataframe.Rd

Lines changed: 3 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)