Skip to content

Instantly share code, notes, and snippets.

@jimhester
Created May 14, 2015 16:55
Show Gist options
  • Save jimhester/d59cda542277626e50e9 to your computer and use it in GitHub Desktop.
Save jimhester/d59cda542277626e50e9 to your computer and use it in GitHub Desktop.
Crayon Error
R Under development (unstable) (2015-05-13 r68364) -- "Unsuffered Consequences"
Copyright (C) 2015 The R Foundation for Statistical Computing
Platform: i386-w64-mingw32/i386 (32-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> library(testthat)
> library("covr")
>
> test_check("covr")
Compiled : ..........
R6 : ...
RC : ...
S4 : Loading required package: TestS4
..
codecov : Loading required package: TestS4
1Loading required package: TestS4
...Loading required package: TestS4
....Loading required package: TestS4
.....Loading required package: TestS4
........Loading required package: TestS4
........Loading required package: TestS4
.....Loading required package: TestS4
......Loading required package: TestS4
......Loading required package: TestS4
.....Loading required package: TestS4
......Loading required package: TestS4
......
coveralls : Loading required package: TestS4
.....Loading required package: TestS4
................
environment_coverage : .
function_coverage : .........
trace_calls : ..
parse_exclusions : .......
normalize_exclusions : ..............
exclude : .......
file_exclusions : .....
evaluated functions : ....
gcov : .......
package_coverage : .
print function : C:\Octave\OCTAVE~1.2\bin\tput: unknown terminal "cygwin"
2C:\Octave\OCTAVE~1.2\bin\tput: unknown terminal "cygwin"
3C:\Octave\OCTAVE~1.2\bin\tput: unknown terminal "cygwin"
4
summary_functions : ...
trace_calls : ............
test_directory : ....
1. Error: it generates a properly formatted json file --------------------------
'"git"' not found
1: withCallingHandlers(eval(code, new_test_environment), error = capture_calls)
2: eval(code, new_test_environment)
3: eval(expr, envir, enclos)
4: with_envvar(ci_vars, {
with_mock(`httr:::perform` = function(...) list(...), `httr::content` = identity,
`httr:::body_config` = function(...) list(...), res <- codecov("TestS4"),
json <- jsonlite::fromJSON(res[[5]][[1]]), expect_match(json$files$name,
rex::rex("R", one_of("/", "\\"), "TestS4.R")), expect_equal(json$files$coverage[[1]],
c(NA, NA, NA, NA, NA, 5, 2, 5, 3, 5, NA, NA, NA, NA, NA, NA, NA, NA,
NA, NA, NA, NA, NA, 1, NA, NA, NA, NA, NA, 1, NA, NA, NA, NA, NA,
1, NA)), expect_equal(json$uploader, "R"))
}) at test-codecov.R:51
5: force(code)
6: with_mock(`httr:::perform` = function(...) list(...), `httr::content` = identity,
`httr:::body_config` = function(...) list(...), res <- codecov("TestS4"), json <- jsonlite::fromJSON(res[[5]][[1]]),
expect_match(json$files$name, rex::rex("R", one_of("/", "\\"), "TestS4.R")),
expect_equal(json$files$coverage[[1]], c(NA, NA, NA, NA, NA, 5, 2, 5, 3, 5, NA,
NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, NA, NA, NA, NA, NA, 1,
NA, NA, NA, NA, NA, 1, NA)), expect_equal(json$uploader, "R")) at test-codecov.R:52
7: eval(expression, parent.frame())
8: eval(expr, envir, enclos)
9: codecov("TestS4")
10: local_branch()
11: in_dir(dir, branch <- system_output("git", c("rev-parse", "--abbrev-ref", "HEAD")))
12: force(code)
13: system_output("git", c("rev-parse", "--abbrev-ref", "HEAD"))
14: withCallingHandlers(with_envvar(env, system(full, intern = TRUE, ignore.stderr = quiet,
...)), warning = function(w) stop(w))
15: with_envvar(env, system(full, intern = TRUE, ignore.stderr = quiet, ...))
16: force(code)
17: system(full, intern = TRUE, ignore.stderr = quiet, ...)
2. Error: format_percentage works as expected ----------------------------------
.onLoad failed in loadNamespace() for 'crayon', details:
call: if (cols %in% c(0, 1)) {
error: argument is of length zero
1: withCallingHandlers(eval(code, new_test_environment), error = capture_calls)
2: eval(code, new_test_environment)
3: eval(expr, envir, enclos)
4: expect_equal(format_percentage(0), "\033[31m0.00%\033[39m") at test-print.R:7
5: expect_that(object, equals(expected, label = expected.label, ...), info = info, label = label)
6: condition(object)
7: compare(expected, actual, ...)
8: compare.character(expected, actual, ...)
9: identical(x, y)
10: format_percentage(0)
11: crayon::red
12: getExportedValue(pkg, name)
13: asNamespace(ns)
14: getNamespace(ns)
15: tryCatch(loadNamespace(name), error = function(e) stop(e))
16: tryCatchList(expr, classes, parentenv, handlers)
17: tryCatchOne(expr, names, parentenv, handlers[[1L]])
18: value[[3L]](cond)
3. Error: print.coverage prints by = "line" by default -------------------------
.onLoad failed in loadNamespace() for 'crayon', details:
call: if (cols %in% c(0, 1)) {
error: argument is of length zero
1: withCallingHandlers(eval(code, new_test_environment), error = capture_calls)
2: eval(code, new_test_environment)
3: eval(expr, envir, enclos)
4: expect_message(print(cov, by = "expression"), rex::rex("R", one_of("/", "\\"), "TestPrint.R: ",
anything, "66.67%")) at test-print.R:23
5: expect_that(object, shows_message(regexp, ...), info = info, label = label)
6: condition(object)
7: evaluate_promise(expr)
8: with_sink(temp, withCallingHandlers(withVisible(code), warning = wHandler, message = mHandler))
9: withCallingHandlers(withVisible(code), warning = wHandler, message = mHandler)
10: withVisible(code)
11: print(cov, by = "expression")
12: print.coverage(cov, by = "expression")
13: message(crayon::bold(paste(collapse = " ", c(to_title(type), "Coverage: "))), format_percentage(overall_percentage))
14: crayon::bold
15: getExportedValue(pkg, name)
16: asNamespace(ns)
17: getNamespace(ns)
18: tryCatch(loadNamespace(name), error = function(e) stop(e))
19: tryCatchList(expr, classes, parentenv, handlers)
20: tryCatchOne(expr, names, parentenv, handlers[[1L]])
21: value[[3L]](cond)
4. Error: print.coverage prints by = "line" by default -------------------------
.onLoad failed in loadNamespace() for 'crayon', details:
call: if (cols %in% c(0, 1)) {
error: argument is of length zero
1: withCallingHandlers(eval(code, new_test_environment), error = capture_calls)
2: eval(code, new_test_environment)
3: eval(expr, envir, enclos)
4: expect_message(print(cov, group = "functions"), rex::rex("test_me", anything, "100.00%")) at test-print.R:42
5: expect_that(object, shows_message(regexp, ...), info = info, label = label)
6: condition(object)
7: evaluate_promise(expr)
8: with_sink(temp, withCallingHandlers(withVisible(code), warning = wHandler, message = mHandler))
9: withCallingHandlers(withVisible(code), warning = wHandler, message = mHandler)
10: withVisible(code)
11: print(cov, group = "functions")
12: print.coverage(cov, group = "functions")
13: message(crayon::bold(paste(collapse = " ", c(to_title(type), "Coverage: "))), format_percentage(overall_percentage))
14: crayon::bold
15: getExportedValue(pkg, name)
16: asNamespace(ns)
17: getNamespace(ns)
18: tryCatch(loadNamespace(name), error = function(e) stop(e))
19: tryCatchList(expr, classes, parentenv, handlers)
20: tryCatchOne(expr, names, parentenv, handlers[[1L]])
21: value[[3L]](cond)
Error: Test failures
Execution halted
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment