plot.new has not been called yet

I am doing principal component analysis with fa.parallel(), and got the following error without having any plots showed up. How can I deal with it?
Thank you very much!

setwd("C:/Users/78167/Desktop/IE7275")

library(psych)
library(readxl)
prob1 <- read_excel("NHL.xlsx")
New names:

  • `` -> ...1

fa.parallel(prob1[, 12:26], fa = "PC", n.iter = 100)
Error in int_abline(a = a, b = b, h = h, v = v, untf = untf, ...) :
plot.new has not been called yet
In addition: There were 17 warnings (use warnings() to see them)

PS. I have already installed "psych" package and "readxl" package.

Can you provide a reproducible example?

The dataset is not allowed to upload on this platform, and the code I provided above should be run successfully with a scree plot with the following warning message. But it can't work on my device.

library(psych)
library(openxlsx)
NHL <- read.xlsx("/.../NHL.xlsx")
fa.parallel(NHL[,12:25],n.iter = 100,fa="pc")

Warning in fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs

= np.obs, : The estimated weights for the factor scores are probably

incorrect. Try a different factor score estimation method.

You don't need to upload your whole dataset. Just an example of it. You can make up the values. Without an example, it will be pretty hard to for anyone to work out the problem and thus answer your question.

Have a look at the article.

ex <- head(prob1[12:20])
> ex
# A tibble: 6 x 9
  `p\rpc`    gg   gag  five   PPP   PKP shots   sag   sc1
    <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
1   0.689  3.02  2.28  1.32  16.8  84.3  31.5  29.5 0.82 
2   0.665  2.92  2.4   1.18  22.3  83.7  30.9  27.2 0.783
3   0.665  2.78  2.7   1.04  15.7  81    30    28.9 0.766
4   0.671  2.61  2.24  1.18  16.5  83.7  28.5  30.1 0.821
5   0.659  3.16  2.51  1.28  18.8  83.7  29.6  27.9 0.761
6   0.622  2.68  2.27  1.19  17.6  83.4  33.9  30.2 0.761

fa.parallel(ex, fa = "PC", n.iter = 100)

Can you provide the output of dput(head(prob1[12:20]))?

dput(head(prob1[12:20]))
pc` = c(0.689, 0.665, 0.665, 0.671, 0.659, 
0.622), gg = c(3.02, 2.92, 2.78, 2.61, 3.16, 2.68), gag = c(2.28, 
2.4, 2.7, 2.24, 2.51, 2.27), five = c(1.32, 1.18, 1.04, 1.18, 
1.28, 1.19), PPP = c(16.8, 22.3, 15.7, 16.5, 18.8, 17.6), PKP = c(84.3, 
83.7, 81, 83.7, 83.7, 83.4), shots = c(31.5, 30.9, 30, 28.5, 
29.6, 33.9), sag = c(29.5, 27.2, 28.9, 30.1, 27.9, 30.2), sc1 = c(0.82, 
0.783, 0.766, 0.821, 0.761, 0.761)), row.names = c(NA, -6L), class = c("tbl_df", 
"tbl", "data.frame"))

You didn't copy your dput properly.

This works:

prob1 <- tibble(`p\rpc` = c(0.689, 0.665, 0.665, 0.671, 0.659, 0.622),
                 gg = c(3.02, 2.92, 2.78, 2.61, 3.16, 2.68),
                 gag = c(2.28, 2.4, 2.7, 2.24, 2.51, 2.27),
                 five = c(1.32, 1.18, 1.04, 1.18, 1.28, 1.19),
                 PPP = c(16.8, 22.3, 15.7, 16.5, 18.8, 17.6), 
                 PKP = c(84.3, 83.7, 81, 83.7, 83.7, 83.4),
                 shots = c(31.5, 30.9, 30, 28.5, 29.6, 33.9),
                 sag = c(29.5, 27.2, 28.9, 30.1, 27.9, 30.2), 
                 sc1 = c(0.82, 0.783, 0.766, 0.821, 0.761, 0.761))

I might have a look at it later anyway.

It seemed to work fine for me, but with a number of warning messages:

library(psych)
library(tidyverse)

prob1 <- tibble(`p\rpc` = c(0.689, 0.665, 0.665, 0.671, 0.659, 0.622),
                gg = c(3.02, 2.92, 2.78, 2.61, 3.16, 2.68),
                gag = c(2.28, 2.4, 2.7, 2.24, 2.51, 2.27),
                five = c(1.32, 1.18, 1.04, 1.18, 1.28, 1.19),
                PPP = c(16.8, 22.3, 15.7, 16.5, 18.8, 17.6), 
                PKP = c(84.3, 83.7, 81, 83.7, 83.7, 83.4),
                shots = c(31.5, 30.9, 30, 28.5, 29.6, 33.9),
                sag = c(29.5, 27.2, 28.9, 30.1, 27.9, 30.2), 
                sc1 = c(0.82, 0.783, 0.766, 0.821, 0.761, 0.761))

fa.parallel(prob1, n.iter = 100, fa="pc")

Thank you. I copied your code and Rstudio showed me these. I know it should be worked since my TA ran my code successfully. I just don't understand why this keeps happening.

library(psych)
> fa.parallel(prob1[,12:26], fa = "PC", n.iter = 100)
Error in int_abline(a = a, b = b, h = h, v = v, untf = untf, ...) : 
  plot.new has not been called yet
此外: Warning messages:
1: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
2: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
3: In fac(r = r, nfactors = nfactors, n.obs = n.obs, rotate = rotate,  :
  An ultra-Heywood case was detected.  Examine the results carefully
4: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
5: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
6: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
7: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
8: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
9: In fa.stats(r = r, f = f, phi = phi, n.obs = n.obs, np.obs = np.obs,  :
  The estimated weights for the factor scores are probably incorrect.  Try a different factor score estimation method.
10: In fac(r = r, nfactors = nfactors, n.obs = n.obs, rotate = rotate,  :
  An ultra-Heywood case was detected.  Examine the results carefully
> prob1 <- tibble(`p\rpc` = c(0.689, 0.665, 0.665, 0.671, 0.659, 0.622),
+                 gg = c(3.02, 2.92, 2.78, 2.61, 3.16, 2.68),
+                 gag = c(2.28, 2.4, 2.7, 2.24, 2.51, 2.27),
+                 five = c(1.32, 1.18, 1.04, 1.18, 1.28, 1.19),
+                 PPP = c(16.8, 22.3, 15.7, 16.5, 18.8, 17.6), 
+                 PKP = c(84.3, 83.7, 81, 83.7, 83.7, 83.4),
+                 shots = c(31.5, 30.9, 30, 28.5, 29.6, 33.9),
+                 sag = c(29.5, 27.2, 28.9, 30.1, 27.9, 30.2), 
+                 sc1 = c(0.82, 0.783, 0.766, 0.821, 0.761, 0.761))
Error in tibble(`p\rpc` = c(0.689, 0.665, 0.665, 0.671, 0.659, 0.622),  : 
  没有"tibble"这个函数
> library(tidyverse)
-- Attaching packages ---------------------------------------------- tidyverse 1.3.0 --
√ ggplot2 3.3.3     √ purrr   0.3.4
√ tibble  3.0.5     √ dplyr   1.0.3
√ tidyr   1.1.2     √ stringr 1.4.0
√ readr   1.4.0     √ forcats 0.5.1
-- Conflicts ------------------------------------------------- tidyverse_conflicts() --
x ggplot2::%+%()   masks psych::%+%()
x ggplot2::alpha() masks psych::alpha()
x dplyr::filter()  masks stats::filter()
x dplyr::lag()     masks stats::lag()
> prob1 <- tibble(`p\rpc` = c(0.689, 0.665, 0.665, 0.671, 0.659, 0.622),
+                 gg = c(3.02, 2.92, 2.78, 2.61, 3.16, 2.68),
+                 gag = c(2.28, 2.4, 2.7, 2.24, 2.51, 2.27),
+                 five = c(1.32, 1.18, 1.04, 1.18, 1.28, 1.19),
+                 PPP = c(16.8, 22.3, 15.7, 16.5, 18.8, 17.6), 
+                 PKP = c(84.3, 83.7, 81, 83.7, 83.7, 83.4),
+                 shots = c(31.5, 30.9, 30, 28.5, 29.6, 33.9),
+                 sag = c(29.5, 27.2, 28.9, 30.1, 27.9, 30.2), 
+                 sc1 = c(0.82, 0.783, 0.766, 0.821, 0.761, 0.761))
> fa.parallel(prob1, n.iter = 100, fa = "PC")
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0
In factor.scores, the correlation matrix is singular, an approximation is used
In smc, smcs < 0 were set to .0
In smc, smcs < 0 were set to .0

Error in int_abline(a = a, b = b, h = h, v = v, untf = untf, ...) : 
  plot.new has not been called yet
此外: There were 50 or more warnings (use warnings() to see the first 50)

This topic was automatically closed 21 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.