Skip to content

Commit

Permalink
Merge branch 'feature/cat-reports' into 234-skip-summary
Browse files Browse the repository at this point in the history
  • Loading branch information
Kirill Müller committed Jan 25, 2016
2 parents d553f32 + 2e7b6e3 commit 8307196
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/reporter-summary.r
Original file line number Diff line number Diff line change
Expand Up @@ -106,7 +106,7 @@ SummaryReporter <- setRefClass("SummaryReporter", contains = "Reporter",
labels <- c(1:9, letters, LETTERS)

cat_reports <- function(reports, summary_fun, collapse) {
reports <- vapply(min(seq_along(reports), length(labels)), function(i) {
reports <- vapply(seq_len(min(length(reports), length(labels))), function(i) {
summary_fun(reports[[i]], labels[i])
}, character(1L))
cat(paste(reports, collapse = collapse), "\n", sep = "")
Expand Down

0 comments on commit 8307196

Please sign in to comment.