library(texPreview)
$set(
tex_optsreturnType = 'html',
opts.html = list(width = '75%', height = '75%')
)
<- iris[c(1:5,51:55,101:105),rev(names(iris))]
iris_rev
|>
iris_rev ::kable(format = "latex",row.names = FALSE) |>
knitrtex_preview()
|>
iris_rev ::kable(format = "latex",row.names = FALSE) |>
knitr::kable_styling(latex_options = 'striped',
kableExtrastripe_index = c(1:5,11:15)) |>
::collapse_rows(columns = c(1)) |>
kableExtratex_preview()
|>
iris_rev ::xtable() |>
xtabletex_preview(print.xtable.opts = list(include.rownames = FALSE))
<- c(4.17,5.58,5.18,6.11,4.50,4.61,5.17,4.53,5.33,5.14)
ctl <- c(4.81,4.17,4.41,3.59,5.87,3.83,6.03,4.89,4.32,4.69)
trt <- gl(2,10,20, labels = c("Ctl","Trt"))
group <- c(ctl, trt)
weight
lm(weight ~ group) |>
::texreg(caption.above = TRUE,
texregcaption = 'Ordinary least squares model') |>
::tex_preview()
texPreview#> Warning: Package varwidth Warning: Failed to reprocess entire contents on input line 18.
#> Package varwidth Warning: Failed to reprocess entire contents on input line 18.
library(nlme)
.1 <- lme(distance ~ age, data = Orthodont, random = ~ 1)
model.2 <- lme(distance ~ age + Sex, data = Orthodont, random = ~ 1)
model
list(model.1, model.2) |>
::texreg(booktabs = TRUE,
texregdcolumn = TRUE,
caption.above = TRUE,
caption = 'Linear mixed-effects models') |>
::tex_preview()
texPreview#> Warning: Package varwidth Warning: Failed to reprocess entire contents on input line 19.
#> Package varwidth Warning: Failed to reprocess entire contents on input line 19.