Skip to content

Commit

Permalink
lintr
Browse files Browse the repository at this point in the history
  • Loading branch information
strengejacke committed Oct 4, 2023
1 parent 21c6211 commit ec8d4dc
Showing 1 changed file with 8 additions and 8 deletions.
16 changes: 8 additions & 8 deletions R/r2.R
Original file line number Diff line number Diff line change
Expand Up @@ -600,7 +600,7 @@ r2.rma <- function(model, ...) {
#' @export
r2.feis <- function(model, ...) {
out <- list(
R2 = c(`R2` = model$r2),
R2 = c(R2 = model$r2),
R2_adjusted = c(`adjusted R2` = model$adj.r2)
)

Expand Down Expand Up @@ -651,7 +651,7 @@ r2.fixest_multi <- function(model, ...) {
r2.felm <- function(model, ...) {
model_summary <- summary(model)
out <- list(
R2 = c(`R2` = model_summary$r2),
R2 = c(R2 = model_summary$r2),
R2_adjusted = c(`adjusted R2` = model_summary$r2adj)
)

Expand All @@ -665,7 +665,7 @@ r2.felm <- function(model, ...) {
#' @export
r2.iv_robust <- function(model, ...) {
out <- list(
R2 = c(`R2` = model$r.squared),
R2 = c(R2 = model$r.squared),
R2_adjusted = c(`adjusted R2` = model$adj.r.squared)
)

Expand All @@ -679,7 +679,7 @@ r2.iv_robust <- function(model, ...) {
r2.ivreg <- function(model, ...) {
model_summary <- summary(model)
out <- list(
R2 = c(`R2` = model_summary$r.squared),
R2 = c(R2 = model_summary$r.squared),
R2_adjusted = c(`adjusted R2` = model_summary$adj.r.squared)
)

Expand Down Expand Up @@ -725,7 +725,7 @@ r2.biglm <- function(model, ...) {
r2.lmrob <- function(model, ...) {
model_summary <- summary(model)
out <- list(
R2 = c(`R2` = model_summary$r.squared),
R2 = c(R2 = model_summary$r.squared),
R2_adjusted = c(`adjusted R2` = model_summary$adj.r.squared)
)

Expand Down Expand Up @@ -759,7 +759,7 @@ r2.Arima <- function(model, ...) {
r2.plm <- function(model, ...) {
model_summary <- summary(model)
out <- list(
R2 = c(`R2` = model_summary$r.squared[1]),
R2 = c(R2 = model_summary$r.squared[1]),
R2_adjusted = c(`adjusted R2` = model_summary$r.squared[2])
)

Expand All @@ -776,7 +776,7 @@ r2.selection <- function(model, ...) {
return(NULL)
}
out <- list(
R2 = c(`R2` = model_summary$rSquared$R2),
R2 = c(R2 = model_summary$rSquared$R2),
R2_adjusted = c(`adjusted R2` = model_summary$rSquared$R2adj)
)

Expand All @@ -792,7 +792,7 @@ r2.svyglm <- function(model, ...) {
rsq.adjust <- 1 - ((1 - rsq) * (model$df.null / model$df.residual))

out <- list(
R2 = c(`R2` = rsq),
R2 = c(R2 = rsq),
R2_adjusted = c(`adjusted R2` = rsq.adjust)
)

Expand Down

0 comments on commit ec8d4dc

Please sign in to comment.