Error in row_splits[[i]] : subscript out of bounds gtsave()

gtsave() : Save a gt table to a file

#?gtsave()
getwd()
gt_tbl <- 
  exibble %>% 
   gt(rowname_col = "row" , 
      groupname_col =  "group")
gt_tbl 
 gt_tbl %>%  gtsave ("tab_r.rtf")

Error in row_splits[[i]] : subscript out of bounds
20.
rtf_body_row(row_splits[[i]], type = "row")
19.
create_body_component_r(data = data)
18.
as_rtf(.)
17.
function_list[i]
16.
freduce(value, _function_list)
15.
_fseq(_lhs)
14.
eval(quote(_fseq(_lhs)), env, env)
13.
eval(quote(_fseq(_lhs)), env, env)
12.
withVisible(eval(quote(_fseq(_lhs)), env, env))
11.
data %>% as_rtf() %>% writeLines(con = filename)
10.
gt_save_rtf(data, filename, path, ...)
9.
gtsave(., "tab_r.rtf")
8.
function_list[k]
7.
withVisible(function_list[k])
6.
freduce(value, _function_list)
5.
_fseq(_lhs)
4.
eval(quote(_fseq(_lhs)), env, env)
3.
eval(quote(_fseq(_lhs)), env, env)
2.
withVisible(eval(quote(_fseq(_lhs)), env, env))
1.
gt_tbl %>% gtsave("tab_r.rtf")

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.