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

x = 'Gov50:'
x + " Data"
#> Error in x + " Data": non-numeric argument to binary operator

Created on 2020-09-22 by the reprex package (v0.3.0)

a = "wrong"
a + 7
#> Error in a + 7: non-numeric argument to binary operator

Created on 2020-09-22 by the reprex package (v0.3.0)

library(ggthemes)

ugrad_total <- inner_join(sep_old, sep_new, by="id") %>%
  mutate(ugrad_diff = u_grad_new-u_grad_old) %>%
  select(-department.y, -title.y, -name.y) %>%
  arrange(desc(ugrad_diff)) %>%
  slice(1:5, 392:396) %>%
  mutate(positive = ifelse(ugrad_diff > 0, "Increase", "Decrease")) %>%
  mutate(ugrad_diff_abs = abs(ugrad_diff)) %>%
  group_by(positive)
#> Error in inner_join(sep_old, sep_new, by = "id") %>% mutate(ugrad_diff = u_grad_new - : could not find function "%>%"

ggplot(ugrad_total, aes(x=name.x, y=ugrad_diff_abs)) +
  facet_wrap(~positive) +
  labs(title= "Biggest Changes in Course Enrollment", x="Course Title", y="Change in Enrollment") +
  theme_bw() +
  theme(axis.text.x=element_text(angle=90,hjust=1))
#> Error in ggplot(ugrad_total, aes(x = name.x, y = ugrad_diff_abs)): could not find function "ggplot"

Testing out asking for help!
Created on 2020-09-22 by the reprex package (v0.3.0)

x = "hello"
x + "yes"
#> Error in x + "yes": non-numeric argument to binary operator

Created on 2020-09-22 by the reprex package (v0.3.0)

x = "hello"
x + "bye"
#> Error in x + "bye": non-numeric argument to binary operator

Created on 2020-09-22 by the reprex package (v0.3.0)

summarize(u_grad = sum(u_grad), .group = "drop")
#> Error in summarize(u_grad = sum(u_grad), .group = "drop"): could not find function "summarize"
summarize(u_grad = sum(u_grad), .group = "drop")
#> Error in summarize(u_grad = sum(u_grad), .group = "drop"): could not find function "summarize"

Created on 2020-09-22 by the reprex package (v0.3.0)

install.packages("reprex")
library(reprex)

library(tidyverse)
library(ggplot2)

ggplot(data = trains, mapping = aes(x = nothing, y = something)) +
geombar()

Test!

house <- results_house %>% 
  select(cand_id, general_percent, incumbent) %>% 
  mutate(office = "House") 
#> Error in results_house %>% select(cand_id, general_percent, incumbent) %>% : could not find function "%>%"
#> Error in results_house %>% select(cand_id, general_percent, incumbent) %>% : could not find function "%>%"

Created on 2020-09-22 by the reprex package (v0.3.0)

rep <- reprex({
  creative_object <- c("Artha", "Giovanni", "Akila", "Dan")
}, venue = "R"
  
)
#> Error in reprex({: could not find function "reprex"

Created on 2020-09-22 by the reprex package (v0.3.0)

Testing reprex...

library(dslabs)
library(reprex)
library(tidyverse)

data("murders")
murders %>%
  mutate(rate = (todal/population)*1e5) 
#> Error: Problem with `mutate()` input `rate`.
#> x object 'todal' not found
#> i Input `rate` is `(todal/population) * 1e+05`.
library(tidyverse)
library(reprex)
library(dslabs)


data("murders")

murders %>%
  mutate(rate = (tatal/population)*1e5)
#> Error: Problem with `mutate()` input `rate`.
#> x object 'tatal' not found
#> ℹ Input `rate` is `(tatal/population) * 1e+05`.

This is a test.

y <- 2 + "fish"
#> Error in 2 + "fish": non-numeric argument to binary operator

Created on 2020-09-22 by the reprex package (v0.3.0)

y <- 2 + "fish"
#> Error in 2 + "fish": non-numeric argument to binary operator
library(PPBDS.data)
library(ggplot2)

ggplot(trains, aes(age, party))+
  geom_point(x)
#> Error in layer(data = data, mapping = mapping, stat = stat, geom = GeomPoint, : object 'x' not found
library(PPBDS.data)
library(tidyverse)
library(ggplot2)
library(reprex)
trisha <- esjaksjasj/2
#> Error in eval(expr, envir, enclos): object 'esjaksjasj' not found
trisha <- efytfyu/2
#> Error in eval(expr, envir, enclos): object 'efytfyu' not found

trisha <-efytfyu/2
#> Error in eval(expr, envir, enclos): object 'efytfyu' not found

trisha <- efytfyu/2
#> Error in eval(expr, envir, enclos): object 'efytfyu' not found