```{r setup, include=FALSE} library(readr) library(lubridate) library(glue) library(tidyverse)
tree <- read_csv(“cleanedtreesdf2.csv”)
tree <- tree %>% mutate(Date = mdy(Date)) %>% mutate(Sales_Price = as.numeric(Sales_Price)) tree tree %>% select(Sales_Price) %>% count(Sales_Price) %>% arrange(desc(n)) view(tree)
```{r}
ggplot(data = tree,
mapping = aes(x = Date,
y = Amount,
colour = Qty)) +
geom_point() +
labs(title = "revenue for trees",
subtitle = "tree over the years",
x = "years", y = "sales")
{r} ggplot(data = tree, mapping = aes(x = Date, y = Qty, colour = Amount)) + geom_point() + labs(title = "revenue for trees", subtitle = "tree over the years", x = "date", y = "qty")