Skip to content

Commit

Permalink
factors
Browse files Browse the repository at this point in the history
  • Loading branch information
aronatkins committed Jan 2, 2024
1 parent e5d58a0 commit 7cd3b61
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion tests/testthat/test-packrat.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,7 +13,7 @@ library(testthat)
# Other fields are not included in this check.
expect_annotated_description <- function(lib, name) {
desc <- file.path(lib, name)
result <- as.data.frame(readDcf(desc))
result <- as.data.frame(readDcf(desc), stringsAsFactors = FALSE)

expect_equal(result$Package, name)
expect_equal(result$InstallAgent, paste('packrat', packageVersion('packrat')))
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-restore.R
Original file line number Diff line number Diff line change
Expand Up @@ -90,7 +90,7 @@ test_that("annotatePkgDesc annotates a package description", {
)

annotatePkgDesc(pkgRecord, project)
result <- as.data.frame(readDcf(desc))
result <- as.data.frame(readDcf(desc), stringsAsFactors = FALSE)
expect_equal(result$Package, "fake")
expect_equal(result$Version, "1.2.3")
expect_equal(result$InstallAgent, paste('packrat', packageVersion('packrat')))
Expand Down

0 comments on commit 7cd3b61

Please sign in to comment.