Skip to content

Commit

Permalink
tweak tests
Browse files Browse the repository at this point in the history
  • Loading branch information
yihui committed Jan 8, 2021
1 parent 564eb35 commit 28a972f
Showing 1 changed file with 4 additions and 5 deletions.
9 changes: 4 additions & 5 deletions tests/testit/test-utils.R
@@ -1,9 +1,8 @@
library(testit)

assert(
'pkg_file() returns files/dirs from the package installation directory',
dir_exists(pkg_file('resources'))
)
assert('pkg_file() returns files/dirs from the package installation directory', {
(dir_exists(pkg_file('resources')))
})

raw_list = function(x) {
if (!is.list(x)) return(x)
Expand Down Expand Up @@ -69,5 +68,5 @@ assert('modify_yaml perserves original values properly', {
old_content = readLines(test_rmd_file)

modify_yaml(test_rmd_file, .keep_empty = TRUE)
readLines(test_rmd_file) %==% old_content
(readLines(test_rmd_file) %==% old_content)
})

0 comments on commit 28a972f

Please sign in to comment.