Skip to content

Commit

Permalink
[skip style] [skip vbump] Restyle files
Browse files Browse the repository at this point in the history
  • Loading branch information
github-actions[bot] committed Feb 12, 2025
1 parent 59d4563 commit 0a71e06
Show file tree
Hide file tree
Showing 3 changed files with 6 additions and 6 deletions.
2 changes: 1 addition & 1 deletion R/tt_dotabulation.R
Original file line number Diff line number Diff line change
Expand Up @@ -569,7 +569,7 @@ gen_rowvalues <- function(dfpart,
)

# Adding section_div for DataRows (analyze leaves)
#kids <- .set_kids_section_div(kids, spl_section_div(spl), "DataRow")
# kids <- .set_kids_section_div(kids, spl_section_div(spl), "DataRow")

if (is(kids, "error")) {
stop("Error applying analysis function (var - ",
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-accessors.R
Original file line number Diff line number Diff line change
Expand Up @@ -244,7 +244,7 @@ test_structure_with_a_getter <- function(tbl, getter, val_per_lev) {
expect_identical(tree_children(content_elem_tbl)[[1]] %>% getter(), val_per_lev$contentrow)
}

## The elementary table has it?
## The elementary table has it?
leaves_elementary_tbl <- tree_children(split1)[[1]]
expect_identical(leaves_elementary_tbl %>% getter(), val_per_lev$elem_tbl)
expect_identical(tt_labelrow(leaves_elementary_tbl) %>% getter(), val_per_lev$elem_tbl_labelrow)
Expand Down
8 changes: 4 additions & 4 deletions tests/testthat/test-printing.R
Original file line number Diff line number Diff line change
Expand Up @@ -432,14 +432,14 @@ test_that("analyze section_div works correctly", {
lns2 <- capture.output(print(tbl2))
expect_equal(grep("^[*]*$", lns2), c(8, 14))

lyt3 <- basic_table() %>%
lyt3 <- basic_table() %>%
analyze("SEX", section_div = " ") %>%
analyze("STRATA1")
tbl3 <- build_table(lyt3, ex_adsl)
lns3 <- capture.output(print(tbl3))
expect_equal(grep("^[ ]*$", lns3), 8)

lyt4 <- basic_table() %>%
lyt4 <- basic_table() %>%
split_rows_by("STRATA1", section_div = "*") %>%
analyze("SEX", section_div = " ") %>%
analyze("STRATA1")
Expand All @@ -448,10 +448,10 @@ test_that("analyze section_div works correctly", {
expect_equal(grep("^[[:space:]]*$", lns4), c(9, 21, 33))
expect_equal(grep("^[*]*$", lns4), c(14, 26))

lyt5 <- basic_table() %>%
lyt5 <- basic_table() %>%
split_rows_by("STRATA1", section_div = "*") %>%
analyze(c("SEX", "STRATA1"), section_div = " ")
tbl5 <- build_table(lyt5, ex_adsl)
tbl5 <- build_table(lyt5, ex_adsl)
lns5 <- capture.output(print(tbl5))
expect_identical(lns4, lns5)
})
Expand Down

0 comments on commit 0a71e06

Please sign in to comment.