Questions tagged [texreg]

Package for conversion of R regression output to LaTeX or HTML tables

Texreg converts coefficients, standard errors, significance stars, and goodness-of-fit statistics of statistical models into LaTeX tables or HTML tables/MS Word documents or to nicely formatted screen output for the R console for easy model comparison. A list of several models can be combined in a single table. The output is highly customizable. New model types can be easily implemented.

117 questions
0
votes
1 answer

Texreg: Two models in one Latex table

I have two BIFE models that do not work with stargazer, unfortunately. The Texreg package allows me to convert it Latex output, but I do not know how to put two models side by side. The stargazer equivalent would be: stargazer(model1, model2)
TvCasteren
  • 449
  • 3
  • 18
0
votes
0 answers

How to output bootstrap results to LaTeX in R

library(boot) boot_function <- function(data, indices, formula){ d <- data[indices, ] obj <- lm(formula, d) coefs <- summary(obj)$coefficients coefs[, "Std. Error"] } set.seed(8527) fmla <- as.formula("mpg ~ hp * cyl") seboot <-…
Muhammad Kamil
  • 635
  • 2
  • 15
0
votes
1 answer

Texreg is not showing me Rsquare and adjusted Rsquare

I have a model: mixed.lmer.str.df <- lmer(StroopEffort ~ Temperature + RH + sex + (1|Participant) + (1|order), data = df) And I am using LmerTest. The summary is as follow: Summary I want to export it to Latex, The problem is that unlike what I can…
0
votes
1 answer

texreg: numbers as text instead of math

I am using texreg for regression output. I would like to align on decimals in the table. However, all numbers are in math mode, between '$' characters. Is there an option to only enclose the significance stars in '$', leaving the numbers as…
0
votes
1 answer

Texreg table does not fit on one page

I have a texreg (Latex table) that won't fit on one page. How to fit in in single page? library(tidyverse) library(texreg) d <- mtcars %>% mutate_at(.vars=c('vs','am','gear','carb'), .funs=factor) lm <-…
Samuel Saari
  • 1,023
  • 8
  • 13
0
votes
0 answers

Using texreg to print mean of dependent variable instead of R squared in R

I have some regression models that I want to export to LaTeX. I am using the package "texreg". The final output is: \begin{table} \begin{center} \begin{tabular}{l c c} \hline & Model 1 & Model 2 \\ \hline as.factor(treat)1 &…
Muhammad Kamil
  • 635
  • 2
  • 15
0
votes
1 answer

Error in Extending `texreg` for `pcce` models from the `plm` package

Hello stackoverflow community, I am trying to extend texreg to other models, but I ended up with the error, Error in validObject(.Object): invalid class "texreg" object: invalid object for slot "coef.names" in class "texreg": got class "NULL",…
Azaaviela
  • 71
  • 6
0
votes
1 answer

Texreg table incomplete

I am trying to finish my texreg table for my glm output and my table looks like this: but I would like it to look like this: Am I missing a step? Thank you for your help!
0
votes
1 answer

Making a latex table from systemfit model?

I am using systemfit to model respondents' prioritization of certain local projects. Their priorities are categorized into six categories. model1<-prior1~ fem+ party_id2 + unemployed model2<-prior2 ~ fem+ party_id2 + unemployed model3<-prior3 ~…
adb
  • 1
0
votes
1 answer

Why does `texreg` argument `scalebox` now throw an error when trying to render Rmarkdown pdf document?

I recently updated my OS, packages, RStudio and R and I tried to run a .Rmd file that worked fine before all the updates. When I ran the .Rmd, I was getting the an error at the end (after it reachd 100%) when trying to render a PDF document (seen…
tall_table
  • 311
  • 3
  • 11
0
votes
1 answer

extract exponential coefficients from models MuMIn::dredge

I'm trying to exponentiate coefficients and standard errors from multiple Poisson models from a MuMIn::dredge object to use with texreg::screenreg. In the case of one model we can do this: library(MuMIn) library(texreg) data(Cement) m1 <- glm(X1 ~…
user63230
  • 4,095
  • 21
  • 43
0
votes
1 answer

How to include odds ratio in texreg table?

So I am trying to display odds ratio in my texreg table: library(texreg) df <- mtcars logit <- glm( formula = am ~ cyl, data = df, family = binomial(link = "logit") ) odds_ratio <- exp(coef(logit)) screenreg(logit, odds_ratio) This,…
SnupSnurre
  • 363
  • 2
  • 12
0
votes
1 answer

Include number of observations in textreg ARIMA output

I'm running several time series regressions. My example is using different data, and I have taken NO care in making these models correct - they are just illustrative for my question. Sorry, I used a downloaded dataset rather than a created one. I…
Andre
  • 101
  • 4
0
votes
1 answer

How to get a nice output-table for a GOLM using package "oglmx"?

I run a generalized ordinal linear model with the package "oglmx" - so far so good. The model is specified as follows: scarce.cs.golm <- oglmx(as.factor(SCARCE) ~ region + wavet + sex + age.s + edu + income + urban + reli2 + …
0
votes
0 answers

How to align table columns i PDF with `texreg`

The texreg package is supposed to write tables with nicely aligned columns, using the command dcolumn = TRUE, see the user's guide for the texreg package, dated 3 March 2018. The command calls the dcolumn package, but dcolumn is not available for…
cibr
  • 453
  • 5
  • 16