Skip to content

Commit

Permalink
Fixed bug that dropped first error stratum in tidy.aovlist, regarding…
Browse files Browse the repository at this point in the history
… issue #26
  • Loading branch information
dgrtwo committed Feb 10, 2015
1 parent ed59e24 commit eab8cfc
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/anova_tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -69,7 +69,7 @@ tidy.aovlist <- function(x, ...) {
x <- x[-1L]
}

ret <- plyr::ldply(x[-1], tidy, .id = "stratum")
ret <- plyr::ldply(x, tidy, .id = "stratum")
# get rid of leading and training whitespace in term and stratum columns
ret <- ret %>% mutate(term = stringr::str_trim(term),
stratum = stringr::str_trim(stratum))
Expand Down

0 comments on commit eab8cfc

Please sign in to comment.