Skip to content

Commit

Permalink
merge pr #1033: v0.7.8 release candidate
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch authored Jun 24, 2021
2 parents c366963 + 1b0ea51 commit d7f6db9
Show file tree
Hide file tree
Showing 6 changed files with 9 additions and 51 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
Type: Package
Package: broom
Title: Convert Statistical Objects into Tidy Tibbles
Version: 0.7.7.9000
Version: 0.7.8
Authors@R:
c(person(given = "David",
family = "Robinson",
Expand Down
4 changes: 1 addition & 3 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,6 +1,4 @@
# broom 0.7.7.9000

To be released as broom 0.7.8.
# broom 0.7.8

* Fixed bug in `glance.ergm` related to handling of MCMC details.
* Address breakages in unit tests for {fixest} tidiers.
Expand Down
22 changes: 0 additions & 22 deletions R/ergm-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,28 +19,6 @@
#' \item{std.error}{The standard error}
#' \item{mcmc.error}{The MCMC error}
#' \item{p.value}{The two-sided p-value}
#' @examples
#'
#' library(ergm)
#' # Using the same example as the ergm package
#' # Load the Florentine marriage network data
#' data(florentine)
#'
#' # Fit a model where the propensity to form ties between
#' # families depends on the absolute difference in wealth
#' gest <- ergm(flomarriage ~ edges + absdiff("wealth"))
#'
#' # Show terms, coefficient estimates and errors
#' tidy(gest)
#'
#' # Show coefficients as odds ratios with a 99% CI
#' tidy(gest, exponentiate = TRUE, conf.int = TRUE, conf.level = 0.99)
#'
#' # Take a look at likelihood measures and other
#' # control parameters used during MCMC estimation
#' glance(gest)
#' glance(gest, deviance = TRUE)
#' glance(gest, mcmc = TRUE)
#'
#' @references Hunter DR, Handcock MS, Butts CT, Goodreau SM, Morris M (2008b).
#' \pkg{ergm}: A Package to Fit, Simulate and Diagnose Exponential-Family
Expand Down
2 changes: 1 addition & 1 deletion cran-comments.md
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
# broom 0.7.7
# broom 0.7.8

## Test environments

Expand Down
24 changes: 0 additions & 24 deletions man/tidy.ergm.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

6 changes: 6 additions & 0 deletions tests/testthat/test-fixest.R
Original file line number Diff line number Diff line change
Expand Up @@ -80,6 +80,9 @@ test_that("augment.fixest", {
})

test_that("all other fixest estimators run", {
skip_on_cran()
skip_on_ci()

form <- v2 ~ v4 | id
res_feglm <- fixest::feglm(form, data = df, family = 'gaussian')
res_fenegbin <- fixest::fenegbin(form, data = df)
Expand Down Expand Up @@ -130,6 +133,9 @@ test_that("all other fixest estimators run", {


test_that("tidiers work with model results or summary of model results", {
skip_on_cran()
skip_on_ci()

# Default standard errors are clustered by `id`. Test against non-default
# independent, heteroskedastic ("hetero") standard errors.
fit2_summ <- summary(fit2, se = "hetero")
Expand Down

0 comments on commit d7f6db9

Please sign in to comment.