Skip to content

Commit

Permalink
fixing top_left material in case of (N=xx)
Browse files Browse the repository at this point in the history
  • Loading branch information
Melkiades committed Oct 16, 2023
1 parent 7994851 commit 75eb2f6
Show file tree
Hide file tree
Showing 4 changed files with 17 additions and 15 deletions.
18 changes: 10 additions & 8 deletions R/tt_export.R
Original file line number Diff line number Diff line change
Expand Up @@ -736,19 +736,21 @@ tt_to_flextable <- function(tt,
if (isFALSE(counts_in_newline) && any(has_nclab)) {
whsnc <- which(has_nclab) # which rows have it
what_is_nclab <- det_nclab[whsnc, ]

# condition for popping the interested row by merging the upper one
hdr[whsnc - 1, what_is_nclab] <- paste(hdr[whsnc - 1, what_is_nclab],
hdr[whsnc, what_is_nclab] <- paste(hdr[whsnc - 1, what_is_nclab],
hdr[whsnc, what_is_nclab],
sep = " "
)
hdr[whsnc, what_is_nclab] <- ""

hdr[whsnc - 1, what_is_nclab] <- ""
# We can remove the row if they are all ""
if (all(!nzchar(hdr[whsnc, ]))) {
hdr <- hdr[-whsnc, , drop = FALSE]
spans <- spans[-whsnc, , drop = FALSE]
body <- body[-whsnc, , drop = FALSE]
mpf_aligns <- mpf_aligns[-whsnc, , drop = FALSE]
row_to_pop <- whsnc - 1
if (all(!nzchar(hdr[row_to_pop, ]))) {
hdr <- hdr[-row_to_pop, , drop = FALSE]
spans <- spans[-row_to_pop, , drop = FALSE]
body <- body[-row_to_pop, , drop = FALSE]
mpf_aligns <- mpf_aligns[-row_to_pop, , drop = FALSE]
hnum <- hnum - 1
}
}
Expand Down
1 change: 1 addition & 0 deletions tests/testthat/test-exporters.R
Original file line number Diff line number Diff line change
Expand Up @@ -255,6 +255,7 @@ test_that("export_as_rtf works", {
res <- export_as_rtf(tbl, file = tmpf)
expect_true(file.exists(tmpf))
})

# Flextable and docx support ---------------------------------------------------
test_that("Can create flextable object that works with different styles", {
analysisfun <- function(x, ...) {
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-lyt-tabulation.R
Original file line number Diff line number Diff line change
Expand Up @@ -1029,7 +1029,7 @@ test_that("cut functions work", {

mf <- matrix_form(tbl)
expect_identical(mf$strings[2, , drop = TRUE],
c("", rep(ctnames, 3)))
c("counts", rep(ctnames, 3)))

lcm <- basic_table() %>%
split_cols_by("ARM") %>%
Expand Down
11 changes: 5 additions & 6 deletions tests/testthat/test-printing.R
Original file line number Diff line number Diff line change
Expand Up @@ -147,7 +147,7 @@ test_that("newline in column names and possibly cell values work", {
expect_identical(mf_nlheader(matform2),
4L)
expect_identical(matform2$strings[1:4, 1, drop = TRUE],
c("Ethnicity", " Factor2", "", ""))
c("", "", "Ethnicity", " Factor2"))

## cell has \n

Expand Down Expand Up @@ -557,23 +557,22 @@ test_that("Support for newline characters in all the parts", {
analyze("BMRKR1", na_str = "asd\nasd") %>% # \n error
build_table(DM_trick)

top_left(tbl) <- c("a", "b\nd\n\n", "c\n\n") # last \n is eaten up, if in the middle error
top_left(tbl) <- c("\na", "b\nd\n\n", "c\n\n") # last \n is eaten up, if in the middle error
main_title(tbl) <- "why not \nalso here\n"
# matrix_form(tbl)
to_string_matrix2(tbl, hsep = "-", with_spaces = TRUE, print_txt_to_copy = TRUE)
out <- strsplit(toString(tbl, hsep = "-"), "\\n")[[1]]
expected <- c(
"why not ",
"also here",
"",
"",
"---------------------------------",
" ",
"a ",
"b ",
"d ",
" ",
"c A wo",
" TWO ",
" A wo",
"c TWO ",
" words rd ",
"---------------------------------",
"m ",
Expand Down

0 comments on commit 75eb2f6

Please sign in to comment.