Thread for students in Gov 1005 to post practice reprexes. Please do not answer them!

This thread is for Gov 1005 to post practice reprexes. There is no need to answer them.

library(tidyverse)
  
mtcars %>% 
  select(mpg, hp) %>% 
  filtez(hp == 110)
#> Error in filtez(., hp == 110): could not find function "filtez"

Created on 2021-02-15 by the reprex package (v1.0.0)

library(tidyverse)

cars %>%
  filter(sped < 6)
#> Error: Problem with `filter()` input `..1`.
#> x object 'sped' not found
#> ℹ Input `..1` is `sped < 6`.
#> Backtrace:
#>      █
#>   1. └─cars %>% filter(sped < 6)
#>   2.   ├─base::withVisible(eval(quote(`_fseq`(`_lhs`)), env, env))
#>   3.   └─base::eval(quote(`_fseq`(`_lhs`)), env, env)
#>   4.     └─base::eval(quote(`_fseq`(`_lhs`)), env, env)
#>   5.       └─`_fseq`(`_lhs`)
#>   6.         └─magrittr::freduce(value, `_function_list`)
#>   7.           ├─base::withVisible(function_list[[k]](value))
#>   8.           └─function_list[[k]](value)
#>   9.             ├─dplyr::filter(., sped < 6)
#>  10.             └─dplyr:::filter.data.frame(., sped < 6)
#>  11.               └─dplyr:::filter_rows(.data, ...)
#>  12.                 └─base::tryCatch(...)
#>  13.                   └─base:::tryCatchList(expr, classes, parentenv, handlers)
#>  14.                     └─base:::tryCatchOne(expr, names, parentenv, handlers[[1L]])
#>  15.                       └─value[[3L]](cond)
#>  16.                         └─dplyr:::stop_dplyr(...)

Created on 2021-02-16 by the reprex package (v1.0.0)

Hi I was having trouble with this code, any advice?

library(tidyverse)
library(primer.data)
nhanes %>%
  select(gender, height) %>%
  drop_na() %>% 
  group_byo(gender)
#> Error in group_byo(., gender): could not find function "group_byo"

library(tidyverse)
library(primer.data)

nhanes %>%
  filter(weight = 34)
#> Error: Problem with `filter()` input `..1`.
#> x Input `..1` is named.
#> ℹ This usually means that you've used `=` instead of `==`.
#> ℹ Did you mean `weight == 34`?

library(tidyverse)
library(primer.data)

nhanes %>%
filter(age = 34)
#> Error: Problem with filter() input ..1.
#> x Input ..1 is named.
#> i This usually means that you've used = instead of ==.
#> i Did you mean age == 34?

library(tidyverse)
library(primer.data)
nhanes %>% 
  filter(age = 34)
#> Error: Problem with `filter()` input `..1`.
#> x Input `..1` is named.
#> ℹ This usually means that you've used `=` instead of `==`.
#> ℹ Did you mean `age == 34`?
library(tidyverse)

mtcars %>%
  filter(mgp < 20)
#> Error: Problem with `filter()` input `..1`.
#> x object 'mgp' not found
#> ℹ Input `..1` is `mgp < 20`.
#> Backtrace:
#>      █
#>   1. └─mtcars %>% filter(mgp < 20)
#>   2.   ├─base::withVisible(eval(quote(`_fseq`(`_lhs`)), env, env))
#>   3.   └─base::eval(quote(`_fseq`(`_lhs`)), env, env)
#>   4.     └─base::eval(quote(`_fseq`(`_lhs`)), env, env)
#>   5.       └─`_fseq`(`_lhs`)
#>   6.         └─magrittr::freduce(value, `_function_list`)
#>   7.           ├─base::withVisible(function_list[[k]](value))
#>   8.           └─function_list[[k]](value)
#>   9.             ├─dplyr::filter(., mgp < 20)
#>  10.             └─dplyr:::filter.data.frame(., mgp < 20)
#>  11.               └─dplyr:::filter_rows(.data, ...)
#>  12.                 └─base::tryCatch(...)
#>  13.                   └─base:::tryCatchList(expr, classes, parentenv, handlers)
#>  14.                     └─base:::tryCatchOne(expr, names, parentenv, handlers[[1L]])
#>  15.                       └─value[[3L]](cond)
#>  16.                         └─dplyr:::stop_dplyr(...)

Created on 2021-02-17 by the reprex package (v1.0.0)

library(tidyverse)
library(primer.data)
nhanes %>%
  groupby(gender) %>%
  arranged(desc(education))
#> Error in arranged(., desc(education)): could not find function "arranged"

There's a typo there. It should be "group_by"

A couple of typos in there. It should be group_by and arrange.

library(tidyverse)
library(primer.data)

nhanes %>%
  select(gender, weight, height, bmi, Pulse) 
#> Error: Can't subset columns that don't exist.
#> x Column `Pulse` doesn't exist.
library(tidyverse)
library(primer.data)

nhanes %>% 
  ggplot(aes(x = age, y = height)) +
  geom_point() +
  meow
#> Error in eval(expr, envir, enclos): object 'meow' not found

Created on 2021-02-17 by the reprex package (v1.0.0)

library(tidyverse)
library(primer.data)


```{r}
nhanes %>% 
  group.by(age)
arrange(des(age))
nhanes %>% 
  select(pulse, hight)
#> Error in nhanes %>% select(pulse, hight): could not find function "%>%"
library(primer.data)
library(tidyverse)
kenya %>% 
  gplot(mapping = aes(x = poverty,
                       y = pop_density)) +
  geom_point()
#> Error in gplot(., mapping = aes(x = poverty, y = pop_density)): could not find function "gplot"
library(primer.data)
library(tidyverse)
governors %>%
  ggplot(mapping = aes(x = death_age, 
                       y = election_ag)) +
  geom_point() 
#> Error in FUN(X[[i]], ...): object 'election_ag' not found
library(tidyverse)
library(primer.data)
governors %>%
  ggplot(mapping = aes(x = death_age,
                       y = election_ag)) +
  geom_point()
#> Error in FUN(X[[i]], ...): object 'election_ag' not found

nhanes %>%
selet(height, weight)
#> Error in nhanes %>% selet(height, weight): could not find function "%>%"