We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 86479d8 commit 191147aCopy full SHA for 191147a
R/gha-summary.R
@@ -8,10 +8,14 @@ create_gha_summary <- function(results) {
8
return()
9
}
10
11
- out <- file(out, open = "wba", encoding = "UTF-8")
+ out <- file(out, open = "a+b", encoding = "unknown")
12
on.exit(close(out), add = TRUE)
13
14
- p <- function(...) cat(..., file = out, append = TRUE)
+ p <- function(...) {
15
+ s <- paste0(...)
16
+ Encoding(s) <- "unknown"
17
+ cat(s, file = out, append = TRUE)
18
+ }
19
fmt_time <- function(x) sprintf("%.3fs", x)
20
21
results <- lapply(results, gha_summarize_test)
0 commit comments