Skip to content

Commit

Permalink
Add DT as a dependency
Browse files Browse the repository at this point in the history
Fixes #2085
  • Loading branch information
jimhester committed Aug 30, 2019
1 parent f58bfe0 commit a814c61
Show file tree
Hide file tree
Showing 4 changed files with 8 additions and 0 deletions.
1 change: 1 addition & 0 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -20,6 +20,7 @@ Imports:
callr,
cli,
digest,
DT,
ellipsis,
git2r (>= 0.23.0),
httr (>= 0.4),
Expand Down
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -82,6 +82,7 @@ export(update_packages)
export(uses_testthat)
export(wd)
export(with_debug)
importFrom(DT,datatable)
importFrom(cli,cat_bullet)
importFrom(cli,cat_line)
importFrom(cli,cat_rule)
Expand Down
4 changes: 4 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,5 +1,9 @@
# devtools (development version)

* Add the DT package as a dependency, so that `test_coverage()` and
`test_coverage_file()` work without having to install additional packages
(#2085).

* All functions taking `...` now use the ellipsis package. This catches errors
when arguments are misspelled or incorrectly specified (#2016)

Expand Down
2 changes: 2 additions & 0 deletions R/test.R
Original file line number Diff line number Diff line change
Expand Up @@ -82,6 +82,8 @@ test <- function(pkg = ".", filter = NULL, ...) {
#' @param show_report Show the test coverage report.
#' @export
#' @rdname test
#' @importFrom DT datatable
# we now depend on DT in devtools so DT is installed when users call test_coverage
test_coverage <- function(pkg = ".", show_report = interactive(), ...) {
pkg <- as.package(pkg)

Expand Down

0 comments on commit a814c61

Please # to comment.