Skip to content

Commit

Permalink
Merge pull request #64 from tidymodels/fix-spark-ci
Browse files Browse the repository at this point in the history
fix spark CI
  • Loading branch information
EmilHvitfeldt authored Dec 12, 2024
2 parents 5679777 + 02fbc64 commit 1f8cb4a
Show file tree
Hide file tree
Showing 2 changed files with 10 additions and 8 deletions.
6 changes: 4 additions & 2 deletions .github/workflows/pkgdown.yaml
Original file line number Diff line number Diff line change
Expand Up @@ -48,8 +48,10 @@ jobs:
if: steps.cache-spark.outputs.cache-hit != 'true'
run: |
sparklyr::spark_install(
version = Sys.getenv("3.3.4"),
hadoop_version = Sys.getenv("3")
version = "3.3.4",
hadoop_version = "3"
)
shell: Rscript {0}

- name: Build site
run: pkgdown::build_site_github_pages(new_process = FALSE, install = FALSE)
Expand Down
12 changes: 6 additions & 6 deletions tests/testthat/helper-initialize.R
Original file line number Diff line number Diff line change
Expand Up @@ -30,7 +30,7 @@ testthat_spark_connection <- function() {
}

testthat_method_connection <- function() {
sc <- spark_connect(
sc <- sparklyr::spark_connect(
master = using_master_get(),
method = using_method_get()
)
Expand All @@ -44,7 +44,7 @@ testthat_shell_connection <- function(method = "shell") {

if (connected) {
sc <- testthat_spark_connection_object()
connected <- connection_is_open(sc)
connected <- sparklyr::connection_is_open(sc)
}

if (Sys.getenv("INSTALL_WINUTILS") == "true") {
Expand All @@ -57,7 +57,7 @@ testthat_shell_connection <- function(method = "shell") {
options(sparklyr.na.omit.verbose = TRUE)
options(sparklyr.na.action.verbose = TRUE)

config <- spark_config()
config <- sparklyr::spark_config()
config[["sparklyr.shell.driver-memory"]] <- "3G"
config[["sparklyr.apply.env.foo"]] <- "env-test"
config[["spark.sql.warehouse.dir"]] <- get_spark_warehouse_dir()
Expand All @@ -70,7 +70,7 @@ testthat_shell_connection <- function(method = "shell") {
packages <- NULL
if (spark_version >= "2.4.2") packages <- c(packages, "delta")

sc <- spark_connect(
sc <- sparklyr::spark_connect(
master = "local",
method = method,
version = spark_version,
Expand All @@ -91,7 +91,7 @@ testthat_livy_connection <- function() {

spark_version <- testthat_spark_env_version()

livy_service_start(
sparklyr::livy_service_start(
version = using_livy_version(),
spark_version = spark_version
)
Expand All @@ -102,7 +102,7 @@ testthat_livy_connection <- function() {
timeout_s = 30
)

sc <- spark_connect(
sc <- sparklyr::spark_connect(
master = "http://localhost:8998",
method = "livy",
version = spark_version
Expand Down

0 comments on commit 1f8cb4a

Please sign in to comment.