Skip to content

Commit

Permalink
updated bioc version
Browse files Browse the repository at this point in the history
  • Loading branch information
aronatkins committed Aug 11, 2023
1 parent 6ae93b2 commit 7e954a4
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 5 deletions.
8 changes: 5 additions & 3 deletions tests/testthat/test-bundlePackagePackrat.R
Original file line number Diff line number Diff line change
Expand Up @@ -37,25 +37,27 @@ test_that("recommended packages are snapshotted", {
})

test_that("works with BioC packages", {
skip_on_cran()
skip_on_ci()
app <- local_temp_app(list("index.Rmd" = c(
"```{r}",
"library(Biobase)",
"```"
)))
withr::local_options(repos = c(
CRAN = "https://cran.rstudio.com",
BioC = "https://bioconductor.org/packages/3.16/bioc"
BioC = "https://bioconductor.org/packages/3.17/bioc"
))

deps <- snapshotPackratDependencies(app)

Biobase <- deps[deps$Package == "Biobase", ]
expect_equal(Biobase$Source, "Bioconductor")
expect_equal(Biobase$Repository, "https://bioconductor.org/packages/3.16/bioc")
expect_equal(Biobase$Repository, "https://bioconductor.org/packages/3.17/bioc")

BiocGenerics <- deps[deps$Package == "BiocGenerics", ]
expect_equal(BiocGenerics$Source, "Bioconductor")
expect_equal(BiocGenerics$Repository, "https://bioconductor.org/packages/3.16/bioc")
expect_equal(BiocGenerics$Repository, "https://bioconductor.org/packages/3.17/bioc")
})

# addPackratSnapshot() ----------------------------------------------------
Expand Down
4 changes: 2 additions & 2 deletions tests/testthat/test-bundlePackageRenv.R
Original file line number Diff line number Diff line change
Expand Up @@ -33,15 +33,15 @@ test_that("works with BioC packages", {
)))
withr::local_options(repos = c(
CRAN = "https://cran.rstudio.com",
BioC = "https://bioconductor.org/packages/3.16/bioc"
BioC = "https://bioconductor.org/packages/3.17/bioc"
))
expect_no_condition(
deps <- snapshotRenvDependencies(app),
class = "rsconnect_biocRepos"
)
Biobase <- deps[deps$Package == "Biobase", ]
expect_equal(Biobase$Source, "Bioconductor")
expect_equal(Biobase$Repository, "https://bioconductor.org/packages/3.16/bioc")
expect_equal(Biobase$Repository, "https://bioconductor.org/packages/3.17/bioc")

withr::local_options(repos = c(
CRAN = "https://cran.rstudio.com"
Expand Down

0 comments on commit 7e954a4

Please sign in to comment.