Skip to content

Commit

Permalink
revert previous and retry
Browse files Browse the repository at this point in the history
  • Loading branch information
dfalbel committed Feb 28, 2024
1 parent bf6bd24 commit 3000b97
Showing 1 changed file with 3 additions and 2 deletions.
5 changes: 3 additions & 2 deletions tests/testthat/test-luz.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,12 +10,13 @@ y_train <- scaled_cars[1:25, 1, drop=FALSE]

set.seed(1)

gc() # to see memory available on CI

luz_fit <- torch::nn_linear %>%
luz::setup(loss = torch::nnf_mse_loss, optimizer = torch::optim_sgd) %>%
luz::set_hparams(in_features = ncol(x_train), out_features = 1) %>%
luz::set_opt_hparams(lr = 0.01) %>%
luz::fit(list(x_train, y_train), verbose = FALSE, dataloader_options = list(batch_size = 5),
accelerator = luz::accelerator(cpu = TRUE))
luz::fit(list(x_train, y_train), verbose = FALSE, dataloader_options = list(batch_size = 5))

v <- vetiver_model(
luz_fit,
Expand Down

0 comments on commit 3000b97

Please sign in to comment.