在print.tbl中使用个人打印方法

Vin*_*der 4 r tibble

我创建了一个名为的类time.这是一个虚拟的例子,它以秒为单位返回.这很好用,但该print.time函数不在tbl中使用.

任何ide我如何调整tbl内的显示?

问候

请看这里的代表

library(dplyr)
#> 
#> Attachement du package : 'dplyr'
#> The following objects are masked from 'package:stats':
#> 
#>     filter, lag
#> The following objects are masked from 'package:base':
#> 
#>     intersect, setdiff, setequal, union
as.time <- function(x){
  class(x)<-"time"
  x
}
print.time<-function(x,...){
  print.default(unclass(x/60)) 
  invisible(x)
}


60 %>% as.time() %>% print()
#> [1] 1


tribble(~a,~time,
        "a",123,
        "b",234,
        "c",456
) %>% mutate(time = as.time(time))
#> # A tibble: 3 x 2
#>   a      time
#>   <chr> <dbl>
#> 1 a       123
#> 2 b       234
#> 3 c       456
Run Code Online (Sandbox Code Playgroud)

reprex包创建于2019-02-07 (v0.2.1)

Col*_*FAY 9

快速而肮脏的黑客

您可以覆盖该print.tbl方法以执行自定义操作,然后调用该tibble:::print.tbl函数:

library(tidyverse)

as.time <- function(x){
  class(x)<-"time"
  x
}

is.time <- function(x) "time" %in% class(x)

res <- tribble(~a,~time,
               "a",123,
               "b",234,
               "c",456
) %>% mutate(time = as.time(time))

print.tbl <- function(x, ...){
  res <- mutate_if(x, is.time, ~ .x / 60)
  tibble:::print.tbl(res, ...)
}
res
#> # A tibble: 3 x 2
#>   a      time
#>   <chr> <dbl>
#> 1 a      2.05
#> 2 b      3.9 
#> 3 c      7.6

# Or if you want to make it ok for CRAN 

print.tbl <- function(x, ...){
  res <- mutate_if(x, is.time, ~ .x / 60)
  print_tbl <- getFromNamespace("print.tbl", "tibble")
  print_tbl(res, ...)
}
res
#> # A tibble: 3 x 2
#>   a      time
#>   <chr> <dbl>
#> 1 a      2.05
#> 2 b      3.9 
#> 3 c      7.6
Run Code Online (Sandbox Code Playgroud)

reprex包创建于2019-02-07 (v0.2.1)

编辑:正确的方法来做到这一点

您需要定义几种方法:print&format, pillar_shafttype_sum.

library(tibble)
library(pillar)
time <- function(x) {
  as_time(x)
}

as_time <- function(x) {
  structure(x, class = "time")
}

c.time <- function(x, ...) {
  as_time(NextMethod())
}

`[.time` <- function(x, i) {
  as_time(NextMethod())
}


format.time <- function(x, ...) {
  ret <- unclass(x / 60)
  format(ret)
}

print.time <- function(x, ...) {
  cat(format(x), sep = "\n")
  invisible(x)
}

time(360)
#> 6

type_sum.time <- function(x) {
  "time"
}

pillar_shaft.time <- function(x, ...) {
  out <- format(x)
  pillar::new_pillar_shaft_simple(out)
}


data <- tibble(
  loc   = time(360)
)

data
#> # A tibble: 1 x 1
#>   loc   
#>   <time>
#> 1 6
Run Code Online (Sandbox Code Playgroud)

reprex包创建于2019-02-07 (v0.2.1)

有关详细信息,请参阅:https://cran.r-project.org/web/packages/tibble/vignettes/extending.html