From 8e40f1aef1635380aaf62bba9d18897160730507 Mon Sep 17 00:00:00 2001 From: olivroy <52606734+olivroy@users.noreply.github.com> Date: Fri, 29 Nov 2024 08:52:13 -0500 Subject: [PATCH 1/6] Avoid tidyselect deprecation warning --- R/gt_preview.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/R/gt_preview.R b/R/gt_preview.R index 2db28aae6e..0bcc95253a 100644 --- a/R/gt_preview.R +++ b/R/gt_preview.R @@ -191,7 +191,7 @@ gt_preview <- function( tab_style( gt_tbl, style = cell_fill(color = "#E4E4E4"), - locations = cells_body(columns = visible_vars, rows = ellipsis_row) + locations = cells_body(columns = all_of(visible_vars), rows = ellipsis_row) ) gt_tbl <- From e33fdc8b8542f3891cb5ccac64455e1e907c7afe Mon Sep 17 00:00:00 2001 From: Teun van den Brand Date: Mon, 9 Dec 2024 11:32:29 +0100 Subject: [PATCH 2/6] reimplement `grid_layout_widths()` --- R/export.R | 182 +++++++++++++++++++++++++++++++---------------------- 1 file changed, 107 insertions(+), 75 deletions(-) diff --git a/R/export.R b/R/export.R index 6d6120384c..2f1109b4ae 100644 --- a/R/export.R +++ b/R/export.R @@ -966,94 +966,126 @@ grid_align_gtable <- function(gtable, data) { } grid_layout_widths <- function(layout, data) { - - widths <- vapply(layout$grobs, `[[`, numeric(1), "width") - - columns <- vctrs::vec_group_loc(layout[, c("left", "right")]) - columns$width <- vapply(columns$loc, function(i) max(widths[i]), numeric(1L)) - - is_single <- columns$key$left == columns$key$right - singles <- columns[is_single, ] - spanner <- columns[!is_single, ] - - widths <- rep_len(0, max(layout$right)) - widths[singles$key$left] <- singles$width - - # Enlarge columns if fixed column widths have been set - column_width <- unlist(dt_boxhead_get(data)$column_width) - fixed <- integer(0) - relative <- rep(NA_real_, length(widths)) - - if (any(nzchar(column_width)) && length(column_width) == length(widths)) { - fixed <- which(endsWith(column_width, "px")) - if (length(fixed) > 0) { - widths[fixed] <- pmax(parse_px_to_pt(column_width[fixed]), widths[fixed]) - } - pct <- which(endsWith(column_width, "%")) - if (length(pct) > 0) { - relative[pct] <- as.numeric(sub("\\%$", "", column_width[pct])) / 100 - } + # This aims to follow ยง17.5.2.2 of + # https://www.w3.org/TR/CSS21/tables.html#auto-table-layout + # with the adjustment that we only care about *minimum* widths, as we + # cannot dynamically reflow cell content in grid. + + # Step 1: Calculate the minimum content width (MCW) of each cell. + # We already added this information to grobs during their construction + mcw <- vapply(layout$grobs, `[[`, numeric(1), "width") + + # Step 2: For each column, determine minimum column width from the cells + # that span that column. + columns <- vctrs::vec_group_loc(layout[, c("left", "right")]) + columns$min_width <- vapply(columns$loc, function(i) max(mcw[i]), numeric(1L)) + # For now, we only care about 1-cell columns, we deal with spans later + singles <- vctrs::vec_slice(columns, columns$key$left == columns$key$right) + width_fix <- width_rel <- rep(0L, max(layout$right)) + width_fix[singles$key$left] <- singles$min_width + orig_width <- width_fix + + # (or the column width, whichever is largest) + set_width <- unlist(dt_boxhead_get(data)$column_width) + is_rel <- grep("\\%$", set_width) + if (length(is_rel) > 0) { + rel <- rep(0L, length(width_rel)) + rel[is_rel] <- as.numeric(gsub("\\%$", "", set_width[is_rel])) / 100 + width_rel <- pmax(width_rel, rel) + width_fix[is_rel] <- 0 + set_width[is_rel] <- "" + } + is_fix <- which(nzchar(set_width)) + if (length(is_fix) > 0) { + fix <- rep(0L, length(width_fix)) + fix[is_fix] <- parse_px_to_pt(set_width[is_fix]) + width_fix <- pmax(width_fix, fix) } - pct <- which(!is.na(relative)) - - spanner <- spanner[order(spanner$key$left, spanner$key$right), ] - - for (i in seq_len(nrow(spanner))) { - - left <- spanner$key$left[i] - right <- spanner$key$right[i] - single_size <- sum(widths[left:right]) - extra_width <- spanner$width[i] - single_size - if (extra_width < 0) { + # Step 3: For each cell that spans more than one column, increase the column + # widths it spans so that together, they are at least as wide as the cell. + spans <- vctrs::vec_slice(columns, columns$key$left != columns$key$right) + spans <- vctrs::vec_slice(spans, order(spans$key$left, spans$key$right)) + spans <- vctrs::vec_slice(spans, spans$min_width > 0) + + for (i in vctrs::vec_seq_along(spans)) { + left <- spans$key$left[i] + right <- spans$key$right[i] + idx <- left:right + current_width <- sum(width_fix[idx]) + extra_width <- spans$min_width[i] - current_width + if (extra_width <= 0) { next } - extra_width <- extra_width / (right - left + 1) - widths[left:right] <- widths[left:right] + extra_width + # Distribute additional width over columns + width_fix[idx] <- width_fix[idx] + extra_width / (right - left + 1) } + # We skip step 4 because I don't think column groups are recognized. + # Instead, we are going to integrate the total table width setting total_width <- dt_options_get_value(data, "table_width") - if (endsWith(total_width, "px")) { + # The thought here is that when the total width is more than the sum + # of column widths, the extra width is distributed over the columns. + # When the total width is less, it becomes the minimum width required by all + # columns. - total_width <- parse_px_to_pt(total_width) - extra_width <- total_width - sum(widths) + # Total width is a percentage + if (grepl("\\%$", total_width)) { + total_width <- as.numeric(gsub("\\%$", "", total_width)) / 100 - if (extra_width <= 0 || length(fixed) == length(widths)) { - return(grid::unit(widths, .grid_unit)) - } + # A percentage value for a column width is relative to the table width + width_rel <- width_rel * total_width - change <- setdiff(seq_along(widths), fixed) - widths[change] <- widths[change] + extra_width / (length(widths[change])) - widths <- grid::unit(widths, .grid_unit) - if (length(pct) > 0) { - widths[pct] <- grid::unit(relative[pct], "npc") - } - return(widths) - } + # Distribute extra width over the columns + available_width <- total_width - sum(width_rel) + not_rel <- setdiff(seq_along(width_rel), is_rel) + width_rel[not_rel] <- pmax(available_width / length(not_rel), 0) - if (endsWith(total_width, "%")) { - - # Set the total width in npc units - total_width <- as.numeric(sub("\\%$", "", total_width)) / 100 - change <- setdiff(seq_along(widths), fixed) - extra_width <- rep_len(0, length(widths)) - extra_width[change] <- total_width / length(change) - extra_width <- grid::unit(extra_width, "npc") + } else if (grepl("px$", total_width)) { + # Total width is absolute + total_width <- parse_px_to_pt(total_width) - # Subtract the size of fixed columns from the npc units - extra_width[change] <- extra_width[change] - - grid::unit(sum(widths[fixed]) / length(change), .grid_unit) + # Distribute extra width over the columns + available_width <- total_width * (1 - sum(width_rel)) - sum(width_fix) + not_rel <- setdiff(seq_along(width_fix), is_rel) + available_width <- pmax(available_width / length(not_rel), 0) + width_fix[not_rel] <- width_fix[not_rel] + available_width + + # Translate relative units to absolute units + width_fix[is_rel] <- width_rel[is_rel] * total_width + width_rel <- rep(0, length(width_fix)) + } else if (length(is_rel) > 0 && sum(width_rel) > 0) { + # We have a mixture of relative and absolute units and no total width goal + + # Compute theoretical total width if we scale everything + # based on fixed widths + frac_rel <- sum(width_rel) + sum_fix <- sum(width_fix) / (1 - frac_rel) + + # Compute theoretical total width if we scale everything + # based on relative widths + mult <- width_rel[is_rel] / min(width_rel[is_rel]) + sum_rel <- sum(mult * orig_width[is_rel]) / frac_rel + + # The actual width we use is the maximum + total_width <- max(sum_rel, sum_fix) + + # Redistribute residual width over non-fixed and non-relative columns + available_width <- max(total_width * (1 - frac_rel) - sum(width_fix), 0) + # available_width <- max(total_width - sum(width_fix) - sum_rel * frac_rel, 0) + spread <- setdiff(seq_along(width_fix), union(is_rel, is_fix)) + width_fix[spread] <- width_fix[spread] + available_width / length(spread) + + # Translate relative units + width_fix[is_rel] <- width_rel[is_rel] * total_width + width_rel <- rep(0, length(width_fix)) + } - # Take pairwise max between minimal size and relative size - widths <- grid::unit.pmax(grid::unit(widths, .grid_unit), extra_width) - if (length(pct) > 0) { - widths[pct] <- grid::unit(relative[pct], "npc") - } - return(widths) + # Combine absolute and relative units + width <- grid::unit(width_fix, .grid_unit) + if (sum(width_rel) > 0) { + width <- grid::unit.pmax(width, grid::unit(width_rel, "npc")) } - grid::unit( - ifelse(is.na(relative), widths, relative), - ifelse(is.na(relative), .grid_unit, "npc") - ) + width } From 11d4ab84d67b51f267bbefd600a7f5f257125aa8 Mon Sep 17 00:00:00 2001 From: Teun van den Brand Date: Mon, 9 Dec 2024 11:37:26 +0100 Subject: [PATCH 3/6] adapt test --- tests/testthat/test-as_gtable.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/tests/testthat/test-as_gtable.R b/tests/testthat/test-as_gtable.R index bb0f146747..faa34dbf40 100644 --- a/tests/testthat/test-as_gtable.R +++ b/tests/testthat/test-as_gtable.R @@ -145,7 +145,7 @@ test_that("gtable widths are set appropriately", { expect_equal( as.character(test$widths), - c("0.5null", "0.2npc", "150.5625points", "0.5null") + c("0.5null", "100points", "150.5625points", "0.5null") ) }) From d0d2d4203f9954a8f194b1d108ab047240967c86 Mon Sep 17 00:00:00 2001 From: Teun van den Brand Date: Mon, 9 Dec 2024 11:37:31 +0100 Subject: [PATCH 4/6] add new tests --- tests/testthat/test-as_gtable.R | 30 +++++++++++++++++++++++++++++- 1 file changed, 29 insertions(+), 1 deletion(-) diff --git a/tests/testthat/test-as_gtable.R b/tests/testthat/test-as_gtable.R index faa34dbf40..54121c7658 100644 --- a/tests/testthat/test-as_gtable.R +++ b/tests/testthat/test-as_gtable.R @@ -95,7 +95,7 @@ test_that("gtable widths are set appropriately", { cell_width <- grid::unit.pmax( grid::unit(100, "pt"), - grid::unit(0.4, "npc") + grid::unit(0, "pt") + grid::unit(0.4, "npc") ) expect_equal( @@ -139,6 +139,34 @@ test_that("gtable widths are set appropriately", { as.numeric(test$widths)[4] ) + # Test relative columns + # + absolute width + test <- tbl %>% + cols_width(y ~ pct(30)) %>% + tab_options(table.width = px(500)) %>% + as_gtable(text_grob = dummy_text) + test <- as.numeric(test$widths[2:3]) + expect_equal(test / sum(test), c(0.7, 0.3), tolerance = 1e-6) + + # + relative width + test <- tbl %>% + cols_width(y ~ pct(30)) %>% + tab_options(table.width = pct(50)) %>% + as_gtable(text_grob = dummy_text) + + expect_equal( + test$widths[2:3], + grid::unit.pmax(grid::unit(c(100, 0), "pt"), grid::unit(c(0.35, 0.15), "npc")) + ) + + # + unspecified width + test <- tbl %>% + cols_width(y ~ pct(30)) %>% + as_gtable(text_grob = dummy_text) + test <- as.numeric(test$widths[2:3]) + expect_equal(test / sum(test), c(0.7, 0.3), tolerance = 1e-6) + expect_equal(min(test), 100) + test <- tbl %>% cols_width(x ~ pct(20), y ~ px(200)) %>% as_gtable(tbl, text_grob = dummy_text) From 56d823a6a1abdc3b7f1f287a65697f0fea63bbce Mon Sep 17 00:00:00 2001 From: Teun van den Brand Date: Mon, 9 Dec 2024 11:37:57 +0100 Subject: [PATCH 5/6] add news bullet --- NEWS.md | 2 ++ 1 file changed, 2 insertions(+) diff --git a/NEWS.md b/NEWS.md index eb87686e71..0b9ffed628 100644 --- a/NEWS.md +++ b/NEWS.md @@ -6,6 +6,8 @@ * Tables embedded in Shiny apps with `gt_output()` and `render_gt()` with `ihtml.selection_mode` enabled also act as inputs, reporting the row numbers that are selected (#354, #1368). (@jonthegeek, #1909) +* Improved width calculations in `as_gtable()` (@teunbrand, #1923) + # gt 0.11.1 ## Breaking changes From 1e2a9cf393012db0d23fd250174fa8cffb0c5d55 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Mon, 6 Jan 2025 21:27:12 -0500 Subject: [PATCH 6/6] Change end copyright year to 2025 --- LICENSE | 2 +- LICENSE.md | 2 +- R/as_data_frame.R | 2 +- R/build_data.R | 2 +- R/cols_add.R | 2 +- R/cols_align.R | 2 +- R/cols_align_decimal.R | 2 +- R/cols_hide.R | 2 +- R/cols_label.R | 2 +- R/cols_merge.R | 2 +- R/cols_move.R | 2 +- R/cols_units.R | 2 +- R/cols_width.R | 2 +- R/compile_scss.R | 2 +- R/data_color.R | 2 +- R/datasets.R | 2 +- R/dt__.R | 2 +- R/dt_body.R | 2 +- R/dt_boxhead.R | 2 +- R/dt_cols_merge.R | 2 +- R/dt_data.R | 2 +- R/dt_footnotes.R | 2 +- R/dt_formats.R | 2 +- R/dt_groups_rows.R | 2 +- R/dt_has_built.R | 2 +- R/dt_heading.R | 2 +- R/dt_locale.R | 2 +- R/dt_options.R | 2 +- R/dt_row_groups.R | 2 +- R/dt_source_notes.R | 2 +- R/dt_spanners.R | 2 +- R/dt_stub_df.R | 2 +- R/dt_stubhead.R | 2 +- R/dt_styles.R | 2 +- R/dt_substitutions.R | 2 +- R/dt_summary.R | 2 +- R/dt_transforms.R | 2 +- R/export.R | 2 +- R/extract.R | 2 +- R/fmt.R | 2 +- R/fmt_date_time.R | 2 +- R/fmt_number.R | 2 +- R/format_data.R | 2 +- R/format_vec.R | 2 +- R/gt-package.R | 2 +- R/gt.R | 2 +- R/gt_group.R | 2 +- R/gt_preview.R | 2 +- R/gt_split.R | 2 +- R/gtsave.R | 2 +- R/helpers.R | 2 +- R/image.R | 2 +- R/info_tables.R | 2 +- R/knitr-utils.R | 2 +- R/location_methods.R | 2 +- R/modify_rows.R | 2 +- R/nanoplot.R | 2 +- R/opts.R | 2 +- R/print.R | 2 +- R/quarto.R | 2 +- R/reexports.R | 2 +- R/render_as_html.R | 2 +- R/render_as_i_html.R | 2 +- R/resolver.R | 2 +- R/rows_add.R | 2 +- R/shiny.R | 2 +- R/substitution.R | 2 +- R/summary_rows.R | 2 +- R/tab_create_modify.R | 2 +- R/tab_footnote.R | 2 +- R/tab_info.R | 2 +- R/tab_options.R | 2 +- R/tab_remove.R | 2 +- R/tab_style.R | 2 +- R/tab_style_body.R | 2 +- R/text_transform.R | 2 +- R/topics.R | 2 +- R/utils.R | 2 +- R/utils_color_contrast.R | 2 +- R/utils_environments.R | 2 +- R/utils_examples.R | 2 +- R/utils_general_str_formatting.R | 2 +- R/utils_plots.R | 2 +- R/utils_render_common.R | 2 +- R/utils_render_grid.R | 2 +- R/utils_render_html.R | 2 +- R/utils_render_latex.R | 2 +- R/utils_render_rtf.R | 2 +- R/utils_render_xml.R | 2 +- R/utils_units.R | 2 +- R/z_utils_render_footnotes.R | 2 +- R/zzz.R | 2 +- 92 files changed, 92 insertions(+), 92 deletions(-) diff --git a/LICENSE b/LICENSE index 7d00b8b715..c4ac3ad8ee 100644 --- a/LICENSE +++ b/LICENSE @@ -1,2 +1,2 @@ -YEAR: 2018-2024 +YEAR: 2018-2025 COPYRIGHT HOLDER: Posit Software, PBC diff --git a/LICENSE.md b/LICENSE.md index 1ac13259bc..cb6e4b8bc9 100644 --- a/LICENSE.md +++ b/LICENSE.md @@ -1,6 +1,6 @@ # MIT License -Copyright (c) 2018-2024 Posit Software, PBC +Copyright (c) 2018-2025 Posit Software, PBC Permission is hereby granted, free of charge, to any person obtaining a copy of this software and associated documentation files (the "Software"), to deal diff --git a/R/as_data_frame.R b/R/as_data_frame.R index 24068822e8..c3621cc032 100644 --- a/R/as_data_frame.R +++ b/R/as_data_frame.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/build_data.R b/R/build_data.R index 9eea1d31bd..4351876254 100644 --- a/R/build_data.R +++ b/R/build_data.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_add.R b/R/cols_add.R index f6fc385141..06506c5bea 100644 --- a/R/cols_add.R +++ b/R/cols_add.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_align.R b/R/cols_align.R index e3b8ba9ddd..9386d01504 100644 --- a/R/cols_align.R +++ b/R/cols_align.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_align_decimal.R b/R/cols_align_decimal.R index 9c005885dd..6765acac39 100644 --- a/R/cols_align_decimal.R +++ b/R/cols_align_decimal.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_hide.R b/R/cols_hide.R index b76ae366a2..1b03ac4ac3 100644 --- a/R/cols_hide.R +++ b/R/cols_hide.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_label.R b/R/cols_label.R index f2e8f6aa3e..4b7e6a5ebf 100644 --- a/R/cols_label.R +++ b/R/cols_label.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_merge.R b/R/cols_merge.R index 358a894ee1..1b949b6835 100644 --- a/R/cols_merge.R +++ b/R/cols_merge.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_move.R b/R/cols_move.R index 7485cdb757..e0c3f45ade 100644 --- a/R/cols_move.R +++ b/R/cols_move.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_units.R b/R/cols_units.R index 5d5177f2bf..830087ca91 100644 --- a/R/cols_units.R +++ b/R/cols_units.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/cols_width.R b/R/cols_width.R index cf359224bb..e4792f10d5 100644 --- a/R/cols_width.R +++ b/R/cols_width.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/compile_scss.R b/R/compile_scss.R index 28db93b947..72faff051d 100644 --- a/R/compile_scss.R +++ b/R/compile_scss.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/data_color.R b/R/data_color.R index 79abb9bd79..e5b3f842ff 100644 --- a/R/data_color.R +++ b/R/data_color.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/datasets.R b/R/datasets.R index 418a2621d3..c6a157999c 100644 --- a/R/datasets.R +++ b/R/datasets.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt__.R b/R/dt__.R index 6eee742267..d84b365662 100644 --- a/R/dt__.R +++ b/R/dt__.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_body.R b/R/dt_body.R index 258af141bb..d956430325 100644 --- a/R/dt_body.R +++ b/R/dt_body.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_boxhead.R b/R/dt_boxhead.R index 7682801e2f..5b8bf01d19 100644 --- a/R/dt_boxhead.R +++ b/R/dt_boxhead.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_cols_merge.R b/R/dt_cols_merge.R index 45f7adb67a..d25d3a4fd4 100644 --- a/R/dt_cols_merge.R +++ b/R/dt_cols_merge.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_data.R b/R/dt_data.R index 901490c32e..29a2e8912f 100644 --- a/R/dt_data.R +++ b/R/dt_data.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_footnotes.R b/R/dt_footnotes.R index fd470408d2..63832c4742 100644 --- a/R/dt_footnotes.R +++ b/R/dt_footnotes.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_formats.R b/R/dt_formats.R index 3166b91b71..80ae9fe9db 100644 --- a/R/dt_formats.R +++ b/R/dt_formats.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_groups_rows.R b/R/dt_groups_rows.R index 9042260af7..087671abfb 100644 --- a/R/dt_groups_rows.R +++ b/R/dt_groups_rows.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_has_built.R b/R/dt_has_built.R index ee267377c1..aca2e4f4ef 100644 --- a/R/dt_has_built.R +++ b/R/dt_has_built.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_heading.R b/R/dt_heading.R index 1f7395a143..462fc5ffff 100644 --- a/R/dt_heading.R +++ b/R/dt_heading.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_locale.R b/R/dt_locale.R index bc3f3643e3..ad816d97af 100644 --- a/R/dt_locale.R +++ b/R/dt_locale.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_options.R b/R/dt_options.R index 671e689722..e6bda1322d 100644 --- a/R/dt_options.R +++ b/R/dt_options.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_row_groups.R b/R/dt_row_groups.R index 0aff87f588..2c491abed7 100644 --- a/R/dt_row_groups.R +++ b/R/dt_row_groups.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_source_notes.R b/R/dt_source_notes.R index d06850f3cd..ad15591ef7 100644 --- a/R/dt_source_notes.R +++ b/R/dt_source_notes.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_spanners.R b/R/dt_spanners.R index 01e9380285..38b1ca6ab2 100644 --- a/R/dt_spanners.R +++ b/R/dt_spanners.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_stub_df.R b/R/dt_stub_df.R index 9ae15900f2..7ba754cc8f 100644 --- a/R/dt_stub_df.R +++ b/R/dt_stub_df.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_stubhead.R b/R/dt_stubhead.R index 53885be4f1..a5faabfc5b 100644 --- a/R/dt_stubhead.R +++ b/R/dt_stubhead.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_styles.R b/R/dt_styles.R index cd59913e57..9a56c69d97 100644 --- a/R/dt_styles.R +++ b/R/dt_styles.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_substitutions.R b/R/dt_substitutions.R index 9a3076f492..2e03e8deb5 100644 --- a/R/dt_substitutions.R +++ b/R/dt_substitutions.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_summary.R b/R/dt_summary.R index a9434dae9f..51a974fb3e 100644 --- a/R/dt_summary.R +++ b/R/dt_summary.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/dt_transforms.R b/R/dt_transforms.R index e7ca3ba13d..ff9922132e 100644 --- a/R/dt_transforms.R +++ b/R/dt_transforms.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/export.R b/R/export.R index 2f1109b4ae..76a0b7b93a 100644 --- a/R/export.R +++ b/R/export.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/extract.R b/R/extract.R index bccd0822db..a8647956e4 100644 --- a/R/extract.R +++ b/R/extract.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/fmt.R b/R/fmt.R index fd85ee2ff8..42ee37aadc 100644 --- a/R/fmt.R +++ b/R/fmt.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/fmt_date_time.R b/R/fmt_date_time.R index 54c3692b56..5cd4e2c07a 100644 --- a/R/fmt_date_time.R +++ b/R/fmt_date_time.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/fmt_number.R b/R/fmt_number.R index fb694c9c89..12dcb28946 100644 --- a/R/fmt_number.R +++ b/R/fmt_number.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/format_data.R b/R/format_data.R index aff2f7878f..4bfbbb4295 100644 --- a/R/format_data.R +++ b/R/format_data.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/format_vec.R b/R/format_vec.R index bc3f985bc6..60368d63c2 100644 --- a/R/format_vec.R +++ b/R/format_vec.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/gt-package.R b/R/gt-package.R index 2b5dd5b793..5d81549fd4 100644 --- a/R/gt-package.R +++ b/R/gt-package.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/gt.R b/R/gt.R index b2bd19017a..f8f80e67d5 100644 --- a/R/gt.R +++ b/R/gt.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/gt_group.R b/R/gt_group.R index 6882ba931d..eda41ff4f4 100644 --- a/R/gt_group.R +++ b/R/gt_group.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/gt_preview.R b/R/gt_preview.R index 0bcc95253a..48b0820e95 100644 --- a/R/gt_preview.R +++ b/R/gt_preview.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/gt_split.R b/R/gt_split.R index 799f437f49..a56d22215d 100644 --- a/R/gt_split.R +++ b/R/gt_split.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/gtsave.R b/R/gtsave.R index 9ee55e169d..a5f8885cf9 100644 --- a/R/gtsave.R +++ b/R/gtsave.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/helpers.R b/R/helpers.R index db82ce6af9..0c7f98af7e 100644 --- a/R/helpers.R +++ b/R/helpers.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/image.R b/R/image.R index 7392974ec9..07394d5846 100644 --- a/R/image.R +++ b/R/image.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/info_tables.R b/R/info_tables.R index b6ccf61c6f..0d79f2972a 100644 --- a/R/info_tables.R +++ b/R/info_tables.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/knitr-utils.R b/R/knitr-utils.R index 92aeb81d21..bf8dcbc5d3 100644 --- a/R/knitr-utils.R +++ b/R/knitr-utils.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/location_methods.R b/R/location_methods.R index 6ed8a5bc74..c0d282f10a 100644 --- a/R/location_methods.R +++ b/R/location_methods.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/modify_rows.R b/R/modify_rows.R index 69cee75335..6792785347 100644 --- a/R/modify_rows.R +++ b/R/modify_rows.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/nanoplot.R b/R/nanoplot.R index 7277113529..b1864a7e5f 100644 --- a/R/nanoplot.R +++ b/R/nanoplot.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/opts.R b/R/opts.R index 0374611532..8203b976d0 100644 --- a/R/opts.R +++ b/R/opts.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/print.R b/R/print.R index a07b8959f1..c00c804ef6 100644 --- a/R/print.R +++ b/R/print.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/quarto.R b/R/quarto.R index 7ea0ba1ea3..6b78c979ee 100644 --- a/R/quarto.R +++ b/R/quarto.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/reexports.R b/R/reexports.R index 16144a46b3..c5f088db7c 100644 --- a/R/reexports.R +++ b/R/reexports.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/render_as_html.R b/R/render_as_html.R index 722ea24128..dcc07697bb 100644 --- a/R/render_as_html.R +++ b/R/render_as_html.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/render_as_i_html.R b/R/render_as_i_html.R index ba9a1337aa..73eadfeaa0 100644 --- a/R/render_as_i_html.R +++ b/R/render_as_i_html.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/resolver.R b/R/resolver.R index 3f9905ba9e..4d6031110f 100644 --- a/R/resolver.R +++ b/R/resolver.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/rows_add.R b/R/rows_add.R index 30d8cf448f..85e8aace89 100644 --- a/R/rows_add.R +++ b/R/rows_add.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/shiny.R b/R/shiny.R index 1a8ddbb4b0..7d200f696e 100644 --- a/R/shiny.R +++ b/R/shiny.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/substitution.R b/R/substitution.R index b096e36777..bd0ca0b39e 100644 --- a/R/substitution.R +++ b/R/substitution.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/summary_rows.R b/R/summary_rows.R index 28ec420666..09eb61b281 100644 --- a/R/summary_rows.R +++ b/R/summary_rows.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_create_modify.R b/R/tab_create_modify.R index 4e39c0701a..56ecf061c2 100644 --- a/R/tab_create_modify.R +++ b/R/tab_create_modify.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_footnote.R b/R/tab_footnote.R index 62951365c7..7b8e807b78 100644 --- a/R/tab_footnote.R +++ b/R/tab_footnote.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_info.R b/R/tab_info.R index 450d8dc6c2..eded405d87 100644 --- a/R/tab_info.R +++ b/R/tab_info.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_options.R b/R/tab_options.R index 8b72a512e5..1c49a2b03e 100644 --- a/R/tab_options.R +++ b/R/tab_options.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_remove.R b/R/tab_remove.R index bad714bf06..9bb587d064 100644 --- a/R/tab_remove.R +++ b/R/tab_remove.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_style.R b/R/tab_style.R index 4c17b1e74b..daa90ab1be 100644 --- a/R/tab_style.R +++ b/R/tab_style.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/tab_style_body.R b/R/tab_style_body.R index 6e5e269fb3..f770111fd6 100644 --- a/R/tab_style_body.R +++ b/R/tab_style_body.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/text_transform.R b/R/text_transform.R index dc8967eb54..69ccde7f83 100644 --- a/R/text_transform.R +++ b/R/text_transform.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/topics.R b/R/topics.R index dea410c510..01b0e278ba 100644 --- a/R/topics.R +++ b/R/topics.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils.R b/R/utils.R index d960f624d5..34f2ee9ba7 100644 --- a/R/utils.R +++ b/R/utils.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_color_contrast.R b/R/utils_color_contrast.R index ad1bd9a842..f2787aa8fe 100644 --- a/R/utils_color_contrast.R +++ b/R/utils_color_contrast.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_environments.R b/R/utils_environments.R index 5dc9207ae4..89f445f801 100644 --- a/R/utils_environments.R +++ b/R/utils_environments.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_examples.R b/R/utils_examples.R index 7f5c8f8d0b..9ed55a383d 100644 --- a/R/utils_examples.R +++ b/R/utils_examples.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_general_str_formatting.R b/R/utils_general_str_formatting.R index 5cd039b75b..71e3cd3be6 100644 --- a/R/utils_general_str_formatting.R +++ b/R/utils_general_str_formatting.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_plots.R b/R/utils_plots.R index 5186e41676..cb264228f3 100644 --- a/R/utils_plots.R +++ b/R/utils_plots.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_render_common.R b/R/utils_render_common.R index 6825edf340..1b3ac05323 100644 --- a/R/utils_render_common.R +++ b/R/utils_render_common.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_render_grid.R b/R/utils_render_grid.R index b033268668..126d80595e 100644 --- a/R/utils_render_grid.R +++ b/R/utils_render_grid.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_render_html.R b/R/utils_render_html.R index a5ddc57907..0040f3a160 100644 --- a/R/utils_render_html.R +++ b/R/utils_render_html.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_render_latex.R b/R/utils_render_latex.R index 932c5f356d..efca423cc8 100644 --- a/R/utils_render_latex.R +++ b/R/utils_render_latex.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_render_rtf.R b/R/utils_render_rtf.R index 07ea594fe0..cbccac8022 100644 --- a/R/utils_render_rtf.R +++ b/R/utils_render_rtf.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_render_xml.R b/R/utils_render_xml.R index cdf76a3e5c..d08324302e 100644 --- a/R/utils_render_xml.R +++ b/R/utils_render_xml.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/utils_units.R b/R/utils_units.R index bc14ca5e4f..5340d36127 100644 --- a/R/utils_units.R +++ b/R/utils_units.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/z_utils_render_footnotes.R b/R/z_utils_render_footnotes.R index 4f63aa4b29..211aa35859 100644 --- a/R/z_utils_render_footnotes.R +++ b/R/z_utils_render_footnotes.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html diff --git a/R/zzz.R b/R/zzz.R index b37a0fce8d..b10e2f2d33 100644 --- a/R/zzz.R +++ b/R/zzz.R @@ -14,7 +14,7 @@ # # This file is part of the 'rstudio/gt' project. # -# Copyright (c) 2018-2024 gt authors +# Copyright (c) 2018-2025 gt authors # # For full copyright and license information, please look at # https://gt.rstudio.com/LICENSE.html