Skip to content

Commit

Permalink
merge pr #895: add lavaan:: before lavInspect
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Jul 13, 2020
2 parents 3d7d35e + 60dc8f5 commit 5f58419
Showing 1 changed file with 6 additions and 6 deletions.
12 changes: 6 additions & 6 deletions R/lavaan-tidiers.R
Expand Up @@ -140,12 +140,12 @@ glance.lavaan <- function(x, ...) {
map_df(as.numeric) %>%
bind_cols(
tibble(
converged = lavInspect(x, "converged"),
estimator = lavInspect(x, "options")$estimator,
ngroups = lavInspect(x, "ngroups"),
missing_method = lavInspect(x, "options")$missing,
nobs = sum(lavInspect(x, "nobs")),
norig = sum(lavInspect(x, "norig")),
converged = lavaan::lavInspect(x, "converged"),
estimator = lavaan::lavInspect(x, "options")$estimator,
ngroups = lavaan::lavInspect(x, "ngroups"),
missing_method = lavaan::lavInspect(x, "options")$missing,
nobs = sum(lavaan::lavInspect(x, "nobs")),
norig = sum(lavaan::lavInspect(x, "norig")),
nexcluded = norig - nobs
)
) %>%
Expand Down

0 comments on commit 5f58419

Please sign in to comment.