i instal all this packages
library(readxl)
library(tidyverse)
library(data.table)
library(plyr)
library(dplyr)
library(ggplot2)
library(moonBook)
library(webr)
but when I want to run these cod i get these errors!!!
df_bmi<-df %>% filter(!is.na(BMI_group))
Error in df %>% filter(!is.na(BMI_group)) : could not find function "%>%"
PieDonut(df,aes(Gender,BMI_group),selected=1,labelposition=1,title="Distribution of BMI by age")
Error in aes(Gender, BMI_group) : could not find function "aes"
ggplot(df, aes(Gender, age)) +
- geom_boxplot(aes(color = Residence)) +
- xlab("Gender") +
- ylab("Mean age (years)")+
- scale_color_manual(values = c("#E69F00", "#56B4E9"))+
- facet_wrap(~TownshipName)
Error in ggplot(df, aes(Gender, age)) : could not find function "ggplot"
PieDonut(df,aes(Residence,BMI_group),selected=1,labelposition=1,title="Distribution of BMI by Urbanity")
Error in aes(Residence, BMI_group) : could not find function "aes"