No flags found
Use flags to group coverage reports by test type, project and/or folders.
Then setup custom commit statuses and notifications for each flag.
e.g., #unittest #integration
#production #enterprise
#frontend #backend
00f0137
... +4 ...
3c2118f
Use flags to group coverage reports by test type, project and/or folders.
Then setup custom commit statuses and notifications for each flag.
e.g., #unittest #integration
#production #enterprise
#frontend #backend
5 | 5 | #' syntax highlighting, using ANSI colors, if the terminal supports them. |
|
6 | 6 | #' |
|
7 | 7 | #' @export |
|
8 | + | #' @param warn_conflicts logical. If \code{TRUE}, warnings are printed |
|
9 | + | #' about conflicts from replacing the standard print method. |
|
8 | 10 | ||
9 | - | prettycode <- function() { |
|
11 | + | prettycode <- function(warn_conflicts = TRUE) { |
|
10 | 12 | register_s3_method("prettycode", "print", "function", print.function) |
|
11 | 13 | if (! obj_name %in% search()) { |
|
12 | 14 | env <- new.env(parent = emptyenv()) |
|
13 | 15 | env$print.function <- print.function |
|
14 | 16 | env$`!` <- exclam |
|
15 | - | do.call("attach", list(env, name = obj_name)) |
|
17 | + | do.call("attach", list(env, name = obj_name, warn.conflicts = warn_conflicts)) |
|
16 | 18 | } |
|
17 | 19 | } |
|
18 | 20 |
Files | Coverage |
---|---|
R | 76.13% |
Project Totals (6 files) | 76.13% |
3c2118f
#14
c0b8784
#14
207c21b
#14
cd8a2d1
635ed71
00f0137