search for: ssr

Displaying 20 results from an estimated 35 matches for "ssr".

Did you mean: ss
2004 Jul 01
2
R can't find some functions in assist package
Oh yes. The "load package" under the "packages menu" in the Windows version does that. To check I typed "library(assist)" after starting R. Same behavior, ssr is found, but others like predict.ssr, and plot.ssr, give a "not found" message. Thanks for the suggestion. Mike
2013 May 16
2
R looping help
...,Y[i]) } else { #If a new stand is encountered make your linear model and #collect statistics model<-lm(yi~xi) stands[st]<-Stand[i-1] intercepts[st]<-model$coefficients[1] slopes[st]<-model$coefficients[2] mses[st]<-sum(resid(model)^2)/(length(xi)-2) ssr<-var(yi)*(length(xi)-1)-sum(resid(model)^2) rsquares[st]<-ssr/(var(yi)*(length(xi)-1)) fRatio<-ssr/mses[st] pValues[st]<-1-pf(fRatio,1,length(xi)-2) #Increment the stand number, zero the within stand collections, #and start again st<-st+1 xi<-numeric(0)...
2005 Mar 08
1
coefficient of partial determination...partial r square [ redux]
If I'm not mistaken, partial R-squared is the R^2 of the quantities plotted in a partial residual plot, so you can base the computation on that. Prof. Fox's `car' package on CRAN has a function for creating those plots, but you need to figure out the way to extract the quantities being plotted. [In any case, the basic tools for doing such computations are all in R, and it
2012 Nov 16
2
R-Square in WLS
Hi, I am fitting a weighted least square regression and trying to compute SSE,SST and SSReg but I am not getting SST = SSReg + SSE and I dont know what I am coding wrong. Can you help please? xnam <-colnames(X) # colnames Design Matrix fmla1 <- as.formula(paste("Y ~",paste(xnam, collapse= "+&quo...
2012 Nov 13
1
About systemfit package
...0.3999914 Westinghouse_(Intercept) Westinghouse_value Westinghouse_capital 1.0888770 0.0570091 0.0415065 but when I wrote the following lines: summary(greeneSur) I obtained the following results: systemfit results method: SUR N DF SSR detRCov OLS-R2 McElroy-R2 system 100 85 347048 1.39234e+14 0.844042 0.868682 N DF SSR MSE RMSE R2 Adj R2 Chrysler 20 17 3056.98 179.823 13.4098 0.911862 0.901493 General.Electric 20 17 14009.12 824.066 28.7065 0.687636 0.650887 Gen...
2006 Jun 16
2
Effect size in mixed models
Hello, Is there a way to compare the relative relevance of fixed and random effects in mixed models? I have in mind measures of effect size in ANOVAs, and would like to obtain similar information with mixed models. Are there information criteria that allow to compare the relevance of each of the effects in a mixed model to the overall fit? Thank you, Bruno
2010 Feb 27
1
Newbie help with ANOVA and lm.
...comp <- object$effects[p1] asgn <- object$assign[object$qr$pivot][p1] nmeffects <- c("(Intercept)", attr(object$terms, "term.labels")) tlabels <- nmeffects[1 + unique(asgn)] ss <- c(unlist(lapply(split(comp^2, asgn), sum)), ssr) df <- c(unlist(lapply(split(asgn, asgn), length)), dfr) } else { ss <- ssr df <- dfr tlabels <- character(0L) } ms <- ss/df f <- ms/(ssr/dfr) P <- pf(f, df, dfr, lower.tail = FALSE) I think I understand the check for &...
2002 May 09
4
Rsquared in summary(lm)
Hello, I'm doing some linear regression: >lm<-lm(osas~alp,data) >summary(lm) However, the Rsquared in the output of summary() is not the same as the "standard" Rsquared calculated by spreadsheets, and outlined in statistical guidebooks, being SSR/SSTO. The output says "multiple Rsquared", but it is no multiple regression... What's the difference? Thanks, Wouter Buytaert -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help mailing list -- Read http://www.ci.tuwien.ac.at/~hornik/R/R-FAQ.html...
2010 Aug 30
2
while loop until end of file
...loop that stops once there are no more lines to read from the input file. also not sure of the best way to write in the results, though I think I should use rbind. data <- data.frame(alldata) i <- 1 # need appropriate while loop { ss <- subset(data, Pair==i) ssD <- subset(ss, DR==D) ssR <- subset(ss, DR==R) p1 <- mean(ssD$Length) p2 <- mean(ssR$Length) dif <- p1-p2 out <- rbind(data.frame(P1, P2, diff) i <-i + 1 } write.table(out, file="out", quote=F, row.names=F, col.names=T, sep="\t") I have spent an absurd amount of time trying to sort th...
2007 Jul 12
1
p-value from survreg
...ficients: (Intercept) groups -0.02138485 0.03868351 Scale= 0.01789372 Loglik(model)= 31.1 Loglik(intercept only)= 25.4 Chisq= 11.39 on 1 degrees of freedom, p= 0.00074 n= 16 ---- In general, good places to start are > names(sr) > help(survreg.object) > ssr <- summary(sr) > names(ssr) As someone else pointed out, it's also easy to look at the print.survreg function and see how the value was created -- one of the things I love about S. Unfortunately, doing the above myself showed that I have let the documentation page for survreg.obj...
2009 Mar 14
0
Problem with phantom calls
...CallerID Duration SIP/3008-add0f320 from-internal 1 Up Bridged Call Local/3008 at from-internal- 3008 00:20:26 Local/3008 at from-inte Local/3008 at from-inte macro-dial s 7 Up Dial SIP/3008||sSr 48XXXXXXXX 00:20:26 SIP/3008-add0f320 Local/3008 at from-inte from-internal s 1 Up Bridged Call SIP/vono.linha1-adb0f030 48XXXXXXXX 00:20:26 SIP/vono.linha1-adb SIP/vono.linha1-adb verifica-prefixo s 3 UpQueue 1090...
2010 May 17
0
plm(..., model="within", effect="twoways") is very slow on unablanaced data (was: Re: Regressions with fixed-effect in R)
...e the within R-sq pmodel.response<-plm:::pmodel.response.plm plmr2 <- function(x, adj=TRUE, effect="individual") { ## fetch response and residuals y <- pmodel.response(x, model="within", effect=effect) myres <- resid(x) n <- length(myres) if(adj) { adjssr <- x$df.residual adjtss <- n-1 } else { adjssr <- 1 adjtss <- 1 } ssr <- sum(myres^2)/adjssr tss <- sum(y^2)/adjtss return(1-ssr/tss) } ## prepare the data set.seed(1) n <- 2000 T <- 15 x=rnorm(T*n) x1=runif(T*n) fe=rep(rnorm(1*n),each=T) id=rep(1:(1*n),...
2002 May 11
2
Bug on Mac version of lm()?
...) ybar <- mean(y) Sxx <- sum( (x-xbar)^2 ) b <- sum( (x-xbar)*(y-ybar) )/Sxx # coefficient a <- ybar - b*xbar # interception e <- y - a - b*x # residuals # SSE (error sum of squares) SSE <- sum( e^2 ) # SST (total sum of squares) SST <- sum( (y-ybar)^2 ) # SSR (regression sum of squares) SSR <- b^2 * Sxx # Coefficient of determination r2 <- SSR / SST # unbiased estimator of sigma^2 s.square <- sum(e^2)/(size - 2) # standard error for b std.error.b <- sqrt( s.square/Sxx ) # standard error for intercept std.error.a <- sq...
2007 May 17
4
R2 always increases as variables are added?
Hi, everybody, 3 questions about R-square: ---------(1)----------- Does R2 always increase as variables are added? ---------(2)----------- Does R2 always greater than 1? ---------(3)----------- How is R2 in summary(lm(y~x-1))$r.squared calculated? It is different from (r.square=sum((y.hat-mean (y))^2)/sum((y-mean(y))^2)) I will illustrate these problems by the following codes:
2009 Oct 09
0
Help from Bill Liao
Dear Matthieu or other friends, I want to select two unknown thresholds with the following function: grid<- selectSETAR(x1, m=1, thDelay=0, criterion=C("AIC","SSR"), nthresh=2) print(grid) plot(grid) where x1 is a price time series. However, it always shows the following error. Error in selectSETAR(x1, m = 1, thDelay = 0, criterion = C("AIC", "SSR"), : unused argument(s) (nthresh = 2) > print(grid) thDelay...
2024 Apr 15
2
Synthetic Control Method
....variable = "BFS", time.variable = "DATE", treatment.identifier = XXXX, controls.identifier = unique(INVESTMENTVOLUME$BFS[-which(INVESTMENTVOLUME$BFS == XXXX)]), time.predictors.prior = as.Date("2010-01-01"):as.Date("2017-10-01"), time.optimize.ssr = as.Date("2010-01-01"):as.Date("2017-10-01"), time.plot = as.Date("2010-01-01"):as.Date("2024-03-01"), unit.names.variable = "BFS" ) synth_out <- synth( data.prep.obj = dataprep_out ) I keep getting the same error message. Unf...
2009 Jul 25
2
r2 question
Hi everyone, I have a question about calculating r-squared in R. I have tried searching the archives and couldn't find what I was looking for - but apologies if there is somewhere I can find this... I carried out a droughting experiment to test plant competition under limited water. I had: - 7 different levels of watering treatment (1 -7 - from most watered to least watered/) - 15
2004 Jun 30
0
R can find some functions in assist package
I am a new user to R. I installed and loaded the smoothing spline package called "assist." The function "ssr" seems to work, but "predict.ssr" and some others don't seem to be available, I get a "can't find" message. But they appear in the extensions folder, c:program files\R\rw1091\library\assist\R-ex. What's wrong?
2012 Jul 18
1
Regression Identity
Hi, I see a lot of folks verify the regression identity SST = SSE + SSR numerically, but I cannot seem to find a proof. I wonder if any folks on this list could guide me to a mathematical proof of this fact. Thanks. David. -- View this message in context: http://r.789695.n4.nabble.com/Regression-Identity-tp4636829.html Sent from the R help mailing list archive at Na...
2009 Oct 12
0
Flash / Flex on Rails (Ruby AMF)
...development can answer my question. I''m creating a Flash - Rails application. From what i know Super Simple Remote (AS3 classes) has been migrated to Guttershark since early 2008 and i have tried some tutorials even the one in RubyAMF blog. The problem is i can''t get the correct SSR script. The latest Guttershark repo there''s no events and paging packages. Can anyone suggest me where can i download the working SSR? If it''s inside Guttershark project, what files should i include? Is there a documentation or anything to get started with? Please help Cheers, Di...