Skip to content

Commit

Permalink
export S3 method
Browse files Browse the repository at this point in the history
  • Loading branch information
yihui committed May 15, 2024
1 parent 0d0700f commit 7e53d82
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 0 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -8,6 +8,7 @@ S3method(prepare_evaluate_output,default)
S3method(prepare_evaluate_output,htmlwidget)
S3method(prepare_evaluate_output,knit_asis)
S3method(prepare_evaluate_output,list)
S3method(print,paged_df)
export(all_output_formats)
export(available_templates)
export(beamer_presentation)
Expand Down
1 change: 1 addition & 0 deletions R/html_paged.R
Original file line number Diff line number Diff line change
Expand Up @@ -238,6 +238,7 @@ paged_table <- function(x, options = NULL) {
x
}

#' @export
print.paged_df <- function(x, ...) {
knitr::asis_output(
paged_table_html(x, options = attr(x, "options")),
Expand Down

0 comments on commit 7e53d82

Please sign in to comment.