You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
I expected press() to be silent, but I observe that it prints:
> example("press",package="bench")
press># Helper function to create a simple data.frame of the specified dimensionspress>create_df<-function(rows, cols) {
press+ as.data.frame(setNames(
press+ replicate(cols, runif(rows, 1, 1000), simplify=FALSE),
press+ rep_len(c("x", letters), cols)))
press+ }
press># Run 4 data sizes across 3 samples with 2 replicates (24 total benchmarks)press> press(
press+rows= c(1000, 10000),
press+cols= c(10, 100),
press+rep=1:2,
press+ {
press+dat<- create_df(rows, cols)
press+bench::mark(
press+min_time=.05,
press+bracket=dat[dat$x>500, ],
press+which=dat[which(dat$x>500), ],
press+subset= subset(dat, x>500)
press+ )
press+ }
press+ )
Runningwith:rowscolsrep110001012100001013100010014100001001510001026100001027100010028100001002# A tibble: 24 × 16expressionrowscolsrepminmedian`itr/sec`mem_alloc`gc/sec`<bch:expr><dbl><dbl><int><bch:tm><bch:tm><dbl><bch:byt><dbl>1bracket1000101201.2µs238.7µs3769.116.1KB02which1000101125.7µs192.1µs5073.56.18KB24.63subset1000101179.9µs278.7µs2514.143.81KB04bracket10000101905.8µs1.3ms778.1.12MB25.15which10000101457µs671.7µs1458.565.4KB06subset10000101949.3µs1.44ms707.1.24MB24.47bracket10001001974.4µs1.55ms655.1001.12KB25.28which10001001946.2µs1.04ms903.407.37KB09subset10001001967.1µs1.7ms626.1022.34KB26.110bracket1000010019.35ms9.79ms102.9.81MB68.0# ℹ 14 more rows# ℹ 7 more variables: n_itr <int>, n_gc <dbl>, total_time <bch:tm>,# result <list>, memory <list>, time <list>, gc <list># ℹ Use `print(n = ...)` to see more rows
issue is "Running with:" and lines below it. Can that printout please be suppressed by default? adding a verbose argument would be appreciated.
Surprisingly, even capture.output does not suppress that output:
I expected press() to be silent, but I observe that it prints:
issue is "Running with:" and lines below it. Can that printout please be suppressed by default? adding a verbose argument would be appreciated.
Surprisingly, even
capture.output
does not suppress that output:The text was updated successfully, but these errors were encountered: