ls()
## character(0)
rm(ajay)
## Warning in rm(ajay): object 'ajay' not found
rm(list=ls())
classroom=NULL
classroom$names=c("RamaKiran","Yogisha","Sudeeptha",
                  "Krunal","Anantha","Ankit",
                  "Himagri","Ajith","Girish",
                  "Vinod")
classroom$exp=c(8,4,7,
                3,2,5,
                7,11,8,12)
classroom$download=c(TRUE,TRUE,TRUE,
                     TRUE,FALSE,TRUE,
                     TRUE,TRUE,TRUE,
                     TRUE)

mean(classroom$exp)
## [1] 6.7
classroom2=data.frame(classroom)
hist(classroom2$exp,col="red")

#MO|RAL - INSTRUCTOR SHOULD LOOK AT 2 SEGMENTS
# BEGINNERS AND EXPERIENCED PEOPLE

plot(density(classroom2$exp),col="blue")