tests/testthat/test-bundlePython.R

test_that("getPython looks in argument, RETICULATE_PYTHON, then RETICULATE_PYTHON_FALLBACK", {
  skip_on_cran()

  withr::local_envvar(
    RETICULATE_PYTHON = "~/python",
    RETICULATE_PYTHON_FALLBACK = "~/fallback"
  )
  expect_equal(getPython("~/supplied"), path.expand("~/supplied"))
  expect_equal(getPython(NULL), path.expand("~/python"))

  withr::local_envvar(
    RETICULATE_PYTHON = NA,
    RETICULATE_PYTHON_FALLBACK = "~/fallback"
  )
  expect_equal(getPython(NULL), path.expand("~/fallback"))

  withr::local_envvar(
    RETICULATE_PYTHON = NA,
    RETICULATE_PYTHON_FALLBACK = NA
  )
  expect_equal(getPython(NULL), NULL)
})

test_that("rsconnect.python.enabled overrides getPythonForTarget() default", {
  skip_on_cran()

  expect_equal(getPythonForTarget("p", list(server = "shinyapps.io")), NULL)
  expect_equal(getPythonForTarget("p", list(server = "example.com")), "p")

  withr::local_options(rsconnect.python.enabled = FALSE)
  expect_equal(getPythonForTarget("p", list(server = "shinyapps.io")), NULL)
  expect_equal(getPythonForTarget("p", list(server = "example.com")), NULL)

  withr::local_options(rsconnect.python.enabled = TRUE)
  expect_equal(getPythonForTarget("p", list(server = "shinyapps.io")), "p")
  expect_equal(getPythonForTarget("p", list(server = "example.com")), "p")
})

test_that("can infer env from existing directory", {
  skip_on_cran()

  env <- inferPythonEnv(test_path("test-reticulate-rmds"), pythonPathOrSkip())
  expect_named(env, c("version", "package_manager"))
  expect_named(env$package_manager, c("name", "version", "package_file", "contents"))
})


test_that("doesn't override existing requirements.txt by default", {
  skip_on_cran()

  dir <- local_temp_app(list(requirements.txt = "pip"))
  env <- inferPythonEnv(dir, pythonPathOrSkip())
  expect_equal(env$package_manager$contents, "pip\n")

  env <- inferPythonEnv(dir, pythonPathOrSkip(), forceGenerate = TRUE)
  expect_match(env$package_manager$contents, "generated by rsconnect-python")
})

test_that("throws error if environment.py fails", {
  skip_on_cran()
  skip_on_os("windows")

  dir <- local_temp_app(list(requirements.txt = "\\"))
  Sys.chmod(file.path(dir, "requirements.txt"), "000")

  withr::local_dir(dir)
  expect_snapshot(inferPythonEnv(".", pythonPathOrSkip()), error = TRUE)
})
rstudio/rsconnect documentation built on April 30, 2024, 2:14 p.m.