could not find function

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"
1 Like

Run the code below in a fresh session. If it throws the same error, something is wrong with the location in which the libraries were stored, which can happen if you have packages installed both as root and user.

suppressPackageStartupMessages({
  library(dplyr)
  library(ggplot2)
})

mtcars %>% filter(cyl == 8)
#>                      mpg cyl  disp  hp drat    wt  qsec vs am gear carb
#> Hornet Sportabout   18.7   8 360.0 175 3.15 3.440 17.02  0  0    3    2
#> Duster 360          14.3   8 360.0 245 3.21 3.570 15.84  0  0    3    4
#> Merc 450SE          16.4   8 275.8 180 3.07 4.070 17.40  0  0    3    3
#> Merc 450SL          17.3   8 275.8 180 3.07 3.730 17.60  0  0    3    3
#> Merc 450SLC         15.2   8 275.8 180 3.07 3.780 18.00  0  0    3    3
#> Cadillac Fleetwood  10.4   8 472.0 205 2.93 5.250 17.98  0  0    3    4
#> Lincoln Continental 10.4   8 460.0 215 3.00 5.424 17.82  0  0    3    4
#> Chrysler Imperial   14.7   8 440.0 230 3.23 5.345 17.42  0  0    3    4
#> Dodge Challenger    15.5   8 318.0 150 2.76 3.520 16.87  0  0    3    2
#> AMC Javelin         15.2   8 304.0 150 3.15 3.435 17.30  0  0    3    2
#> Camaro Z28          13.3   8 350.0 245 3.73 3.840 15.41  0  0    3    4
#> Pontiac Firebird    19.2   8 400.0 175 3.08 3.845 17.05  0  0    3    2
#> Ford Pantera L      15.8   8 351.0 264 4.22 3.170 14.50  0  1    5    4
#> Maserati Bora       15.0   8 301.0 335 3.54 3.570 14.60  0  1    5    8
ggplot(mtcars,aes(mpg,cyl)) + geom_point()

Created on 2021-01-01 by the reprex package (v0.3.0.9001)

1 Like

Thank you.
it works. :crossed_fingers:
so i want to know why i get those errors?

This means you are set up correctly and shouldn't see the errors when both dplyr and ggplot are loaded with library(). If you have trouble please post a reprex.

1 Like

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.