Skip to content

Commit

Permalink
get rid of new lints
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed Aug 14, 2023
1 parent 63cc23a commit 7567a09
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 3 deletions.
2 changes: 1 addition & 1 deletion R/helpers_easystats.R
Original file line number Diff line number Diff line change
Expand Up @@ -26,7 +26,7 @@ tidy_model_parameters <- function(model, ...) {
df_r2 <- performance::r2_bayes(model, average = TRUE, verbose = FALSE, ci = stats_df$conf.level[[1]]) %>%
as_tibble() %>%
standardize_names(style = "broom") %>%
rename("estimate" = "r.squared") %>%
rename(estimate = r.squared) %>%
filter(if_any(matches("component"), ~ (.x == "conditional")))

# remove estimates and CIs and use R2 data frame instead
Expand Down
2 changes: 1 addition & 1 deletion R/long_to_wide_converter.R
Original file line number Diff line number Diff line change
Expand Up @@ -90,7 +90,7 @@ long_to_wide_converter <- function(data,
ungroup() %>%
nest_by(.rowid, .key = "nested_data") %>%
filter(sum(is.na(nested_data)) == 0L) %>%
tidyr::unnest(cols = c(nested_data))
tidyr::unnest(cols = nested_data)

# convert to wide?
if (spread && paired) data %<>% tidyr::pivot_wider(names_from = {{ x }}, values_from = {{ y }})
Expand Down
2 changes: 1 addition & 1 deletion R/tidy_model_expressions.R
Original file line number Diff line number Diff line change
Expand Up @@ -45,7 +45,7 @@ tidy_model_expressions <- function(data,
# convert the necessary columns to character type for expression
df <- data %>%
filter(if_all(
.cols = c(matches("estimate|statistic|std.error|p.value")),
.cols = matches("estimate|statistic|std.error|p.value"),
.fns = Negate(is.na)
)) %>%
.data_to_char(k)
Expand Down

0 comments on commit 7567a09

Please sign in to comment.