Skip to content

Commit

Permalink
Merge pull request #1396 from rstudio/update-examples
Browse files Browse the repository at this point in the history
Update examples
  • Loading branch information
t-kalinowski authored Jan 19, 2024
2 parents 3667ec0 + 7e7c850 commit 29c6f70
Show file tree
Hide file tree
Showing 656 changed files with 2,440 additions and 2,345 deletions.
6 changes: 5 additions & 1 deletion R/install.R
Original file line number Diff line number Diff line change
Expand Up @@ -29,6 +29,10 @@ install_keras <- function(
gpu <- (is_linux() && has_nvidia_gpu()) || is_mac_arm64()
}

# keras requires tensorflow be installed still.
if(!any(grepl("tensorflow|tf-nightly", backend)))
backend <- c("tensorflow", backend)

if (isTRUE(gpu)) {
message("Installing GPU components")
if (is_mac_arm64()) {
Expand All @@ -45,7 +49,7 @@ install_keras <- function(
}

if("jax" %in% backend && !is.null(extra_packages))
# undeclared dependancy, import fails otherwise
# undeclared dependency, import fails otherwise
append(extra_packages) <- "packaging"

backend <- unlist(lapply(backend, function(name)
Expand Down
2 changes: 1 addition & 1 deletion docs/404.html

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

2 changes: 1 addition & 1 deletion docs/LICENSE-text.html

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

2 changes: 1 addition & 1 deletion docs/articles/custom_train_step_in_jax.html

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

2 changes: 1 addition & 1 deletion docs/articles/custom_train_step_in_tensorflow.html

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

2 changes: 1 addition & 1 deletion docs/articles/custom_train_step_in_torch.html

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

2 changes: 1 addition & 1 deletion docs/articles/customizing_saving_and_serialization.html

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

2 changes: 1 addition & 1 deletion docs/articles/distributed_training_with_jax.html

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

16 changes: 9 additions & 7 deletions docs/articles/distributed_training_with_tensorflow.html

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

2 changes: 1 addition & 1 deletion docs/articles/distributed_training_with_torch.html

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

Loading

0 comments on commit 29c6f70

Please sign in to comment.