search for: pcor

Displaying 20 results from an estimated 26 matches for "pcor".

Did you mean: cor
2004 May 24
1
discriminant analysis
...e done different discriminant function analysis of multivariat data. With the CV=True option I was not able to perform the predict() call. What do I have to do? Or is there no possibility at all? You also need the predicted values to produce a plot of the analysis, as far as I know. Here my code: pcor.lda2<-lda(pcor~habarea+hcom+isol+flowcov+herbh+inclin+windprot+shrubcov+baregr, data=pcor.df, CV=T) table2<-table(pcor.df$pcor, pcor.lda2$class) table2 #doesn't work, becoause CV=True? pcor.ld2<-predict(pcor.lda2, dimen=1)$x plot(pcor.ld2) plot(pcor.lda2, type="density", dim...
2005 Dec 07
1
KMO sampling adequacy and SPSS -- partial solution
...s classes a lot. It did in mine, and a glance through the R-help archives suggests I'm not alone. I finally found a reference describing the calculation, and wrote the following R function to perform it. Note that the function depends on a partial correlation function found in library(corpcor). kmo.test <- function(df){ ### ## Calculate the Kaiser-Meyer-Olkin Measure of Sampling Adequacy. ## Input should be a data frame or matrix, output is the KMO statistic. ## Formula derived from Hutcheson et al, 1999, ## "The multivariate social scientist," page 224, ISBN 0761952012 #...
2004 May 24
2
Manova and specifying the model
...uct a MANOVA. I know that there 's the manova() funciton and the summary.manova() function to get the appropriate summary of test statistics. I just don't manage to specify my model in the manova() call. How to specify a model with multiple responses and one explanatory factor? If I type: pcor.manova<-manova(isol+hcom+habarea+inclin+windprot+shrubcov+herbh+baregr+flowcov~pcor, data=pcor.df) I always get error messages like: Error in manova(isol + hcom + habarea + inclin + windprot + shrubcov + : need multiple response Can someone help me? Thanks Steffi ----------------...
2009 Sep 30
1
How to calculate KMO?
...et al, 1999, ## "The multivariate social scientist," page 224, ISBN 0761952012 ## see <http://www2.chass.ncsu.edu/garson/pa765/hutcheson.htm><http://www2.chass.ncsu.edu/garson/pa765/hutcheson.htm%3E> ### cor.sq = cor(df)^2 cor.sumsq = (sum(cor.sq)-dim(cor.sq)[1])/2 library(corpcor) pcor.sq = cor2pcor(cor(df))^2 pcor.sumsq = (sum(pcor.sq)-dim(pcor.sq)[1])/2 kmo = sus.cor.ss/(sus.cor.ss+sus.pcor.ss) return(kmo) } What is this object "*sus.cor.ss*"?I get errors > sus.cor.ss Error: object "sus.cor.ss" not found Thanks in advance Moumita [[alternative...
2008 Dec 08
1
partial correlation
Hej! I have the following problem: I would like to do partial correlations on non-parametric data. I checked "pcor" (Computes the partial correlation between two variables given a set of other variables) but I do not know how to change to a Spearman Rank Correlation method [pcor(c("BCDNA","ImProd","A365"),var(PCor))] Here''s a glimpse of my data (data is raw data)....
2009 May 11
0
Partial correlation function required
...das.moumita.online@gmail.com The results of your email command are provided below. Attached is your original message. - Results: Ignoring non-text/plain MIME parts - Unprocessed: What is the function for partial correlation.The function which i found here:-- http://www.yilab.gatech.edu/pcor.R and used the recursive version, showed errors while computing partial correlation,where the third variable i.e controlled variable for a pair is more than that .That is when i had more than one third variable ,it always became an infinite loop,it else. # By using recursive formu...
2009 Nov 11
2
Partial correlations and p-values
I'm trying to write code to calculate partial correlations (along with p-values). I'm new to R, and I don't know how to do this. I have searched and come across different functions, but I haven't been able to get any of them to work (for example, pcor and pcor.test from the ggm package). In the following example, I am trying to compute the correlation between x and y, while controlling for z (partial correlation): x <- c(1,20,14,7,9) y <- c(5,6,7,9,10) z <- c(13,27,16,5,4) What function can I append to this to find this partial corre...
2009 Jun 28
1
ERROR: system is computationally singular: reciprocal condition number = 4.90109e-18
...or in solve.default(Szz) : system is computationally singular: reciprocal condition number = 4.90109e-18* On using the traceback() function i get this:-------------- > traceback() 10: *.Call("La_dgesv", a, b, tol, PACKAGE = "base")* 9: solve.default(Szz) 8: solve(Szz) 7: pcor.mat(firstvalue, secondvalue, third_var, method, na.rm = T) 6: PartialCorr_Calculation(value1, value2, third_var, method = "pearson", na.rm = T) 5: Partial(contrld_third_var(rowvalues$matrix1, rowvalues$matrix2, x <- stringOfItemCategoryToDataFrameOfItemCategory, item_cate...
2011 Apr 26
5
Correlaciones parciales
Muy buenas, quiero calcular correlaciones de Pearson entre dos variables (a,b) teniendo en cuenta una tercera (c). Para ello estoy usando una función llamada "pcor.test" (http://www.yilab.gatech.edu/pcor.html), que en realidad no está en ningún paquete de R, que yo sepa. ¿Alguien conoce una función similar en alguna librería de R? Por otro lado, para ver si me cuadraban los resultados, he hecho una regresión lineal entre las variables "a" y &qu...
2009 Jul 13
0
Partial Correlation
Why do we get Partial correlation values greater than 1? I have used the default function pcor.mat :-- I have manipulated the default pcor.mat function a bit so ignore tha variables corr_type,element1_in_no,element2_in_no,P.Please ignore the ?pairwise? section and have a look at athe ?listwise ? part i.e else part. *pcor.mat <- function(x,y,z,method="p",na.rm=T,corr_type,eleme...
2013 Aug 26
2
Partial correlation test
...the covariate (standard length, SL), I need to use the partial correlation. I know how to calculate it with JMP, but as I used R to analyse all of my data (first time in my life) for this manuscript, can anyone help me to find a solution for this problem? I got some libraries to calculate it (e.g. ppcor, ggm, etc.), but none of them fit to my required analysis (fitting covariate and subset group) in the model. Any help will be very much appreciated. > ### Datafrmame> data1 <- read.csv(file.choose(),header=TRUE) #Partial correlation.csv> data1 Quantity Quality SL Irid.area Ca...
2005 Dec 06
1
about partial correlation
Hello everyone My name is Vangelis and I want to ask a question about partial correlation. I have used the command "pcor.shrink" to evaluate the partial correlations of a data.frame but the problem is that in the output results I cannot see whether these correlations are significant or not. Is there any command which can show me if these correlations are significant at 95% level or another level? Than you very m...
2009 Jun 25
2
Error: system is computationally singular: reciprocal condition number
I get this error while computing partial correlation. *Error in solve.default(Szz) : system is computationally singular: reciprocal condition number = 4.90109e-18* Why is it?Can anyone give me some idea ,how do i get rid it it? This is the function i use for calculating partial correlation. pcor.mat <- function(x,y,z,method="p",na.rm=T){ x <- c(x) y <- c(y) z <- as.data.frame(z) if(dim(z)[2] == 0){ stop("There should be given data\n") } data <- data.frame(x,y,z) if(na.rm == T){ data = na.omit(data) }...
2005 Dec 06
1
about partial correlation (again)
Hello everyone I tried to install the library GeneNT in order to use the command pcor.confint because I want to construct confidence intervals for partial correlations but among other demanding the specific library needs the library "Graph" which I don't have it and I cannot find it at this site. Is there any other site that I can download this library? Thanks Kind...
2009 Mar 31
1
Efficient calculation of partial correlations in R
Hello, I'm looking for an efficient function for calculating partial correlations. I'm currently using the pcor.test () function, which is equivalent to the cor.test() function, and can receive only single vectors as input. I'm looking for something which is equivalent to the cor() function, and can receive matrixes as input (which should make the calculations much more efficient). Thanks, Schragi...
2000 Feb 25
2
partial correlation coefficients in R?
Hello, after thorough searching of the R help files as well as S+-help, I'm coming to the list: Is there a possibility to compute partial correlation coefficients between multiple variables (correlation between two paired samples with the "effects of all other variables partialled out")? All I seem to find are the standard Pearson correlation coefficients (with cor()) and no clue
2004 Nov 11
3
R "sumo" package suggestion
...uot;Status"] install.packages(row.names(test2)[which(test2$Status=="not installed")]) } ---------- Rodney Sparapani Medical College of Wisconsin Sr. Biostatistician Patient Care & Outcomes Research rsparapa at mcw.edu http://www.mcw.edu/pcor Was 'Name That Tune' rigged? WWLD -- What Would Lombardi Do
2007 May 31
1
plotting variable sections of hourly time series data using plot.zoo
...0.235 0.03 0.56 74.72 0.94 736.37 #With help of read.table I got the data into R : DF <- read.table(file=fn,header=FALSE,skip=2) #Substitute the header: names(DF) <- c("year","month","day","hour","FN","Punc","Pcor","Pmelt","ETP","ETR","RS","RI","RB","Rtot","Ssnow","SI","SSM","SUZ","SLZ") #Create datetime vector library(chron) DF$datetime <- with(DF,chron(paste(month,day,year,sep=&...
2008 Jul 12
1
[ESS] Process SAS is not running... error on Ubuntu
...re? So, I don't really see the point of > the > .deb The file that you want is here (and clearly a part of the ESS > package): > > https://svn.r-project.org/ESS/trunk/etc/ess-sas-sh-command > > -- > Rodney Sparapani Center for Patient Care & Outcomes Research (PCOR) > Sr. Biostatistician Department of Medicine > Was 'Name That Tune' rigged? Medical College of Wisconsin (MCW) > WWLD: What Would Lombardi Do Milwaukee, WI, USA > > ______________________________________________ > ESS-help at stat.math.ethz.ch mailing...
2007 Jul 13
2
nearest correlation to polychoric
Dear all, Has someone implemented in R (or any other language) Knol DL, ten Berge JMF. Least-squares approximation of an improper correlation matrix by a proper one. Psychometrika, 1989, 54, 53-61. or any other similar algorithm? Best regards Jens Oehlschl?gel Background: I want to factanal() matrices of polychoric correlations which have negative eigenvalue. I coded Highham 2002