Skip to content

Commit

Permalink
release v1.0.1 (#1118)
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Aug 29, 2022
1 parent 005cdf3 commit e5ef678
Show file tree
Hide file tree
Showing 15 changed files with 17 additions and 19 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
@@ -1,7 +1,7 @@
Type: Package
Package: broom
Title: Convert Statistical Objects into Tidy Tibbles
Version: 1.0.0.9000
Version: 1.0.1
Authors@R:
c(person(given = "David",
family = "Robinson",
Expand Down
4 changes: 1 addition & 3 deletions NEWS.md
@@ -1,6 +1,4 @@
# broom 1.0.0.9000 (developmental version)

To be released as broom 1.0.1.
# broom 1.0.1

* Improves performance of `tidy.lm()` and `tidy.glm()` for full-rank fits (#1112 by `@capnrefsmmat`).
* Moves forward with deprecation of tidiers for sparse matrices outputted from the Matrix package, initially soft-deprecated in broom 0.5.0. The Matrix tidiers were light wrappers around coercion methods that will now be deprecated from Matrix itself in the upcoming 1.4-2 release. The affected methods are `tidy.sparseMatrix()`, `tidy.dgCMatrix()`, and `tidy.dgTMatrix()`. Note that `tidy.confusionMatrix()`, for relevant objects outputted from the caret package, is unaffected (#1113).
Expand Down
2 changes: 1 addition & 1 deletion R/cluster-tidiers.R
Expand Up @@ -25,7 +25,7 @@
#' @seealso [tidy()], [cluster::pam()]
#' @family pam tidiers
# skip running examples - occasionally over CRAN check time limit
#' @examplesIf (rlang::is_installed("cluster") & rlang::is_installed("modeldata"))
#' @examplesIf (rlang::is_installed("cluster") & rlang::is_installed("modeldata") && identical(Sys.getenv("NOT_CRAN"), "true"))
#'
#' # load libraries for models and data
#' library(dplyr)
Expand Down
2 changes: 1 addition & 1 deletion R/spdep-tidiers.R
Expand Up @@ -11,7 +11,7 @@
#' @evalRd return_tidy(regression = TRUE)
#'
# skip running examples - occasionally over CRAN check time limit
#' @examplesIf (rlang::is_installed("spdep") & rlang::is_installed("spatialreg"))
#' @examplesIf (rlang::is_installed("spdep") & rlang::is_installed("spatialreg") && identical(Sys.getenv("NOT_CRAN"), "true"))
#'
#'
#' # load libraries for models and data
Expand Down
2 changes: 1 addition & 1 deletion R/stats-kmeans-tidiers.R
Expand Up @@ -9,7 +9,7 @@
#' @evalRd return_tidy("size", "withinss", "cluster")
#'
# skip running examples - occasionally over CRAN check time limit
#' @examplesIf (rlang::is_installed("cluster") & rlang::is_installed("modeldata"))
#' @examplesIf (rlang::is_installed("cluster") & rlang::is_installed("modeldata") && identical(Sys.getenv("NOT_CRAN"), "true"))
#'
#' library(cluster)
#' library(modeldata)
Expand Down
6 changes: 3 additions & 3 deletions cran-comments.md
@@ -1,5 +1,3 @@
# broom 0.8.0.9000

## R CMD check results

0 WARNINGS, 0 ERRORS, 0 NOTES.
Expand All @@ -8,5 +6,7 @@

We checked 203 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package.

* We saw 0 new problems
* We saw 1 new problem
* We failed to check 0 packages

The new failure arose in checks for the widyr package. We filed an issue as well as a pull request with the needed fixes for their package on Monday, August 15th. See https://github.com/dgrtwo/widyr/issues/40 for more details.
2 changes: 1 addition & 1 deletion man/augment.kmeans.Rd

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

2 changes: 1 addition & 1 deletion man/augment.pam.Rd

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

2 changes: 1 addition & 1 deletion man/augment.sarlm.Rd

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

2 changes: 1 addition & 1 deletion man/glance.kmeans.Rd

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

2 changes: 1 addition & 1 deletion man/glance.pam.Rd

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

2 changes: 1 addition & 1 deletion man/glance.sarlm.Rd

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

2 changes: 1 addition & 1 deletion man/tidy.kmeans.Rd

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

2 changes: 1 addition & 1 deletion man/tidy.pam.Rd

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

2 changes: 1 addition & 1 deletion man/tidy.sarlm.Rd

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

0 comments on commit e5ef678

Please sign in to comment.