m1 = lm(x ~ y)
summary(m1)
res = resid(m1)
hist(res)
qqnorm(res)
qqline(res)
library(car)
crPlots(m1)
wt2 = wt*wt
influencePlot(m1, id.method=“identify”,main=“Influence Plot”, sub=“Circle is proportial to Cook’s Distance” )