Skip to content

Commit 6159cf2

Browse files
bump cut-off to breaking changes
1 parent 5f594d8 commit 6159cf2

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/set-assert-args.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -21,7 +21,7 @@ set_arg_write_tree <- function(write_tree) {
2121
#' @inheritParams make_transformer
2222
#' @keywords internal
2323
assert_transformers <- function(transformers) {
24-
version_cutoff <- 1.5
24+
version_cutoff <- 2.0
2525
no_name <- is.null(transformers$style_guide_name)
2626
no_version <- is.null(transformers$style_guide_version)
2727
if (no_name || no_version) {

tests/testthat/test-exception_handling.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,7 @@ test_that("style_file with no tokens returns empty string and warning", {
2525

2626
test_that("warning is given when transformers does not contain a version", {
2727
sg <- create_style_guide(style_guide_version = NULL)
28-
if (packageVersion("styler") < "1.5") {
28+
if (packageVersion("styler") < "2.0") {
2929
expect_fun <- expect_warning
3030
} else {
3131
expect_fun <- expect_error

0 commit comments

Comments
 (0)