library(psych)
## Warning: package 'psych' was built under R version 3.5.3
data(bfi)
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
bfi = bfi %>% select(-gender, -education, -age)
bfi = bfi %>% na.omit()
bfi.cor = cor(bfi)
correlations <- cov2cor(bfi.cor)
library(corrgram)
## Warning: package 'corrgram' was built under R version 3.5.3
corrgram(correlations)
fa.parallel(correlations, n.obs=145, fa="both", n.iter=100)
## Parallel analysis suggests that the number of factors = 5 and the number of components = 5
fa1 = fa(correlations, nfactors=3, rotate="varimax", fm="ml")
fa.diagram(fa(correlations, nfactors=3, rotate="varimax", fm="ml"))
factor.plot(fa1)
Am exacting in my work. Continue until everything is perfect. Do things according to a plan. Do things in a half-way manner. Waste my time.
Get angry easily. Get irritated easily. Have frequent mood swings. Often feel blue. Panic easily.
Don’t talk a lot. Find it difficult to approach others. Know how to captivate people. Make friends easily. Take charge. Inquire about others’ well-being. Know how to comfort others. Love children. Make people feel at ease.