search for: fagr

Displaying 7 results from an estimated 7 matches for "fagr".

Did you mean: agr
2007 May 19
2
What's wrong with my code ?
...PP5-6 factanal.fit.uls <- function(cmat, factors, start=NULL, lower = 0.005, control = NULL, ...) { FAfn <- function(Psi, S, q) { Sstar <- S - diag(Psi) E <- eigen(Sstar, symmetric = TRUE, only.values = TRUE) e <- E$values[-(1:q)] e <- sum(e^2/2) e } FAgr <- function(Psi, S, q) { Sstar <- S - diag(Psi) E <- eigen(Sstar, symmetric = TRUE) L <- E$vectors[, -(1:q), drop = FALSE] e <- E$values[-(1:q)] gr <- 2*Psi*((L^2)%*%e) gr } p <- ncol(cmat) if(is.null(start)) start <- (1 - 0.5*factors/p)/...
2006 Jul 19
2
get rid of error in Factor Analysis
B??dnie zakodowany tekst zosta? usuni?ty... Plik: nie znany Url: https://stat.ethz.ch/pipermail/r-help/attachments/20060719/3a883e4f/attachment.pl
2007 Jul 13
2
nearest correlation to polychoric
...omputing the nearest correlation matrix - a problem from finance, IMA Journal of Numerical Analysis (2002), 22, 329-343. which basically works but still leaves very small negative eigenvalues which causes factanal() to fail with > factanal(cov=ncor$cor, factors=2) Fehler in optim(start, FAfn, FAgr, method = "L-BFGS-B", lower = lower, : L-BFGS-B ben?tigt endliche Werte von 'fn' Zus?tzlich: Warning message: NaNs wurden erzeugt in: log(x) > version _ platform i386-pc-mingw32 arch i386...
2005 Jun 26
0
Factor correlations in factanal
...q) { sc <- diag(1/sqrt(Psi)) Sstar <- sc %*% S %*% sc E <- eigen(Sstar, symmetric = TRUE, only.values = TRUE) e <- E$values[-(1:q)] e <- sum(log(e) - e) - q + nrow(S) ## print(round(c(Psi, -e), 5)) # for tracing -e } FAgr <- function(Psi, S, q) { sc <- diag(1/sqrt(Psi)) Sstar <- sc %*% S %*% sc E <- eigen(Sstar, symmetric = TRUE) L <- E$vectors[, 1:q, drop = FALSE] load <- L %*% diag(sqrt(pmax(E$values[1:q] - 1, 0)), q) load <- diag(sqrt(Psi))...
2006 Jul 21
0
(no subject)
Hi, I am having problems when trying to apply factor analysis in a covariance matrix, > factanal(covmat=strip1cmcd, factors=5, control=list(lower=0.0264)) Error in optim(start, FAfn, FAgr, method = "L-BFGS-B", lower = lower, : non-finite value supplied by optim In addition: Warning message: NaNs produced in: sqrt(diag(cv)) I have searched for possible solutions in messages posted previously. I think that: Zeroing the workspace is not a requirement of the ori...
2008 Sep 09
1
Addendum to wishlist bug report #10931 (factanal) (PR#12754)
...q) { sc <- diag(1/sqrt(Psi)) Sstar <- sc %*% S %*% sc E <- eigen(Sstar, symmetric = TRUE, only.values = TRUE) e <- E$values[-(1:q)] e <- sum(log(e) - e) - q + nrow(S) ## print(round(c(Psi, -e), 5)) # for tracing -e } FAgr <- function(Psi, S, q) { sc <- diag(1/sqrt(Psi)) Sstar <- sc %*% S %*% sc E <- eigen(Sstar, symmetric = TRUE) L <- E$vectors[, 1:q, drop = FALSE] load <- L %*% diag(sqrt(pmax(E$values[1:q] - 1, 0)), q) load <- diag(sqrt(Psi))...
2009 Jul 23
1
[PATCH server] changes required for fedora rawhide inclusion.
...=;1twRXC05j($d#o_crA|XXV^7!Tt0(xnA zG4mKA*HY(E_(7p%qtvM$?I_5PYtvgh5v~Bt6Dda0E%G>lA?{i_ at C85l@OXxTEf6Pt zv`#nC=yuE&-GpiqO->Xt9$NN(0F4~pmSq}l$M3iWWt7M{C-H%84rDu3L8`?!SJ`~s zV5>pT8;OS&2ZFMNf*1la@#K8kQrmI`x>61(({i{&I&+cgbnC1cZ$U~FEJqh{W at C^R zuHxbRj+<rgB(-3DMjNb$_Rk1=!fAgR)t1r}45z6Yv{9r_YfTDwEqyTrKly5N7{c&c z at qwnls??lD2V~MCNMq<u3m30~QtNz^gC-Pin^z1Hh9t+Q at x{(pYc!a~w;Vw`Zo8n> zeKZ&9KBdTBXCWm}JMjjQOlx6RP+nY;-U^m-koIka3UO__Q$ZDUHCK8gv;%t=G@;GA zpsrS&wz*b8TMeZ`jH6D)Wk%S#Co3A%;h`;{)lLYV;n}k75a)=wme~>;9k<|ybtl!V zCtVFTylE!KkSq!tKi)`FxueREHVDDXmT...