Skip to content

Commit c56e232

Browse files
fix file
1 parent 7cb2ff5 commit c56e232

File tree

1 file changed

+1
-3
lines changed

1 file changed

+1
-3
lines changed

bench/01-declarations.R

Lines changed: 1 addition & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -32,9 +32,7 @@ plot_against_base <- function(new_bm,
3232
stopifnot(nrow(new_bm) == 2)
3333
diff_in_percent <- round(100 * diff(new_bm$p50) / new_bm$p50[1])
3434
pr_comment <- glue::glue("* {name}: {new_bm$p50[1]} -> {new_bm$p50[2]} ({diff_in_percent}%)\n")
35-
file <- "pr-comment/info.txt"
36-
dir.create(dirname(file))
37-
cat(pr_comment, file = file, append = TRUE)
35+
cat(pr_comment, file = "pr-comment/info.txt", append = TRUE)
3836
}
3937
}
4038
}

0 commit comments

Comments
 (0)