search for: b20

Displaying 20 results from an estimated 41 matches for "b20".

Did you mean: 20
2009 Jul 16
0
how to get means and confidence limits after glmmPQL or lmer
...uot;A","I","I","I","I","N","N","N","P","P","P","P","P","P","S","S","S")) treatment<-factor(c("b10","b10","b20","b20","b10","b1","b1","b20","b10","b20","b1","b10","b10","b1","b1","b20","b20","b10","b20","b1")) library(MASS) mm<-g...
2005 Dec 22
1
strsplit with dataframes
Hello fellow R people, I can not figure out a pretty way to use strplit with vectors Imagine that I got the following data from someone with ID's representing several factors ID data A1-B1-t1 0 A1-B1-t2 1 A1-B2-t1 5 A1-B2-t2 10 A1-B10-t1 0 A1-B10-t2 1 A1-B20-t1 5 A1-B20-t2 10 ... I would like to turn this dataframe to station substation time data A1 B1 t1 0 A1 B1 t2 1 A1 B2 t1 5 A1 B2 t2 10 A1 B10 t1 0 A1 B10 t2 1 A1 B20 t1 5 A1 B20 t2 10 ... This must surely be done easily, but there are not an example like this in ?strsplit Chee...
2004 Aug 09
0
Need help on this problem!
...Q1 Med Q3 Max -2.5233682 -0.6801665 -0.1735055 0.5243569 2.7772921 Number of Observations: 666 Number of Groups: 111 However, when I tried to fit the following model and the starting value is very close to the true value: > simu.nlme<-nlme(gf~b00 + b10 * age + b20 * max(0,(age-tau0)),data=simu1,fixed=b00+b10+b20+tau0~1,random=b00+b10+b20+tau0~1,group=~id, start=c(b00=4.08,b10=5.32,b20=-5.29,tau0=14.8),method="REML") It shows following error: ************************************** Error in MEEM(object, conLin, control$niterEM) : Singular...
2010 Jan 07
1
faster GLS code
...ted Kingdom. email: c.fezzi at uea.ac.uk *************************************** Here is an example with 3 equations and 2 exogenous variables: ----- start code ------ N <- 1000 # number of observations library(MASS) ## parameters ## # eq. 1 b10 <- 7; b11 <- 2; b12 <- -1 # eq. 2 b20 <- 5; b21 <- -2; b22 <- 1 # eq.3 b30 <- 1; b31 <- 5; b32 <- 2 # exogenous variables x1 <- runif(min=-10,max=10,N) x2 <- runif(min=-5,max=5,N) # residual covariance matrix sigma <- matrix(c(2,1,0.7,1,1.5,0.5,0.7,0.5,2),3,3) # residuals r <- mvrnorm(N,mu=rep(0,3), S...
2008 Feb 26
2
Combining series of variables using identifier
...frame( indx = 1:20, var1 = rep(c("I20", "I40", "A50", "B60"), each=5), var1_lab= rep(c("cat", "dog", "mouse", "horse"), each=5), var2 = rep(c("B20", "X40", "D50", "G60"), each=5), var2_lab= rep(c("car", "bicycle", "train", "bus"), each=5)) str(a) I'd like to create new variables by combining "varX" and "varX_lab" like this:...
2010 Feb 04
1
Bug in as.character? (PR#14206)
...a which is converted using as.character, looses its last part: ``diagonal = 1e-12)'' Shorter formula is ok though. Best, H??vard ************ Browse[2]> formula.str y ~ -1 + b1 + b2 + b3 + b4 + b5 + b6 + b7 + b8 + b9 + b10 + b11 + b12 + b13 + b14 + b15 + b16 + b17 + b18 + b19 + b20 + b21 + b22 + b23 + b24 + b25 + b26 + b27 + b28 + b29 + b30 + b31 + b32 + b33 + b34 + b35 + b36 + b37 + b38 + b39 + b40 + b41 + b42 + b43 + b44 + b45 + b46 + b47 + b48 + b49 + elevation + f(idx, model = "sphere", sphere.dir = "global_temperature_80s",...
2008 Jun 23
3
Simulating Gaussian Mixture Models
Hi, Is there any package that I can use to simulate the Gaussian Mixture Model , which is a mixture modeling method that is widely used in statistical learning theory. I know there is a mclust, however, I think it is a little bit different from my problem. Thanks very much.. regards. -------------------------- Peng Jiang ?? Ph.D. Candidate Antai College of Economics &
2008 Feb 13
2
Newbie HLM with lme4 questions
...in lmer. Most of the examples we cover in class are change models, i.e., we working with longitudinal data. Specific questions: in HLM 6.0, we build the following model; Y = P0 + P1*(CONFLICT) + P2*(TIMEYRS) + E Level-2 Model P0 = B00 + B01*(H0MCITOT) + R0 P1 = B10 + B11*(H0MCITOT) + R1 P2 = B20 + B21*(H0MCITOT) + R2 Can someone explain to me how to represent this in lmer syntax? I've tried e.g., lmer(MAT ~ 1 + CONFLICT + TIMEYRS + (1 + CONFLICT + + TIMEYRS | H0MCITOT)) But I don't get the same result. More generally: Should I be using the lme4 package, the nlme package, or...
2009 Aug 14
1
problem about t test
Hello, I have a data frame >str(dat)'data.frame': 20000 obs. of 30 variables it contains two information-two types of cancers:stage A(A1 to A10) and stage B(B1 to B20) ##totally 30 patients-20000 sets of gene expression I'd like to find the lists for top 20 differentially expressed genes using t-test (by P-value). Here is my code, unfortunately it doesn't work...I need the help,please. I just learned R for two weeks, and hope you can give the hint! >...
2012 Aug 04
1
lme4 / HLM question
...mer( Y ~ 1 |id , PanelData4) I can't seem to find any examples on-line nor in the help about how to write the lmer4 formula that contains two predictor variables at level 1 with fixed slopes. L1 - Yij = b0 + b1(x) + b2(z) + e L2 - b0 = B00 + u0 b1 = B10 b2 = B20 Can someone give me an example? Thanks Jeff
2011 Dec 27
1
[LLVMdev] compounding loop exit conditions
...olatile int a; int b,e ; .... void *f1 (void *notused) { int *c; int d; while (1) { c = &a; if (*c != 0 ) d = 1; if ( d != 1 && e != 0 && e != d ) break; if ( *c == e) break; } b = 1; } In the BB flow chart, B15 and B20 is the exiting block recognized by LLVM. But One of the loop exit conditions is a combination of the compounded branches located in B15, B12 and B9. Can any suggestion be shared with me to solve this problem? Best, Hanfeng -------------- next part -------------- An HTML attachment was scrubbed....
2010 Dec 06
10
R crashes when making graphs
hi, i am running R with JGR and Deducer under Ubuntu Mint Lucid. since i updated to R 2.12 i can no longer make graphs - R just crashes. the full error report was posted to launchpad (https://bugs.launchpad.net/ubuntu/+source/openjdk-6/+bug/675905) without any success so far. anyone with a similar problem or helpful suggestions? thanks! kat
2006 Dec 07
1
Asterisk accepting calls to fast
...number block 56830-xxx to one of our customers. In the diaplan we have setup extensions like the following ones: exten => 56830910,1,Answer() exten => 56830910,2,Dial(SIP/bduerring,10,tr) exten => 56830910,3,VoiceMail,u20 exten => 56830910,4,hangup exten => 56830910,103,VoiceMail,b20 exten => 56830910,104,hangup exten => 5683091,1,Answer() exten => 5683091,2,DIAL(ZAP/g5/56830990,10,r) exten => 5683091,3,Hangup The problem now is, that sometimes (maybe when the caller doesn't hit the buttons fast enough) asterisk takes the extension for 5683091, although the 0...
2008 Feb 29
1
How to export tables in list separately using write.table or sink?
...frame( indx = 1:20, var1 = rep(c("I20", "I40", "A50", "B60"), each=5), var1_lab= rep(c("cat", "dog", "mouse", "horse"), each=5), var2 = rep(c("B20", "X40", "D50", "G60"), each=5), var2_lab= rep(c("car", "bicycle", "train", "bus"), each=5)) g <- unlist(lapply(a, is.factor)) g <- a[g] g.tablist <- lapply(g, function(x) table(x, g$var1)) for...
2010 Mar 18
2
aumentar tamaño de memoria a mas de 4Gb‏
...######################################################## # Part 1: calibration library(e1071) #calibration step calibrate<-read.table("calibration.txt", header=TRUE) calibrate$calibration<-as.factor(calibrate$calibration) calibrate.rf<-svm(calibration~B1+B14+B15+B16+B17+B18+B19+B20+B21+B24+B25+B26+B51+B52+B53+B54+B55+B56+B57+B58+B59+B60+B61+B62, data=calibrate, cost=6.8, gamma=0.08) #################################################################################################################### ##############################################################################...
2011 Jun 12
2
NLS fit for exponential distribution
Hello there, I am trying to fit an exponential fit using Least squares to some data. #data x <- c(1 ,10, 20, 30, 40, 50, 60, 70, 80, 90, 100) y <- c(0.033823, 0.014779, 0.004698, 0.001584, -0.002017, -0.003436, -0.000006, -0.004626, -0.004626, -0.004626, -0.004626) sub <- data.frame(x,y) #If model is y = a*exp(-x) + b then fit <- nls(y ~ a*exp(-x) + b, data = sub, start
2006 Dec 31
7
zero random effect sizes with binomial lmer
...,0) b9 <- c(0,0,0,0,0,0,0) b10 <- c(0,0,0,0,0,0,0) b11 <- c(0,0,0,0,0,0,0) b12 <- c(0,0,0,0,0,0,0) b13 <- c(0,0,0,0,0,0,1) b14 <- c(0,0,0,0,0,0,1) b15 <- c(0,0,0,0,0,1,0) b16 <- c(0,0,0,0,1,0,0) b17 <- c(0,0,0,1,0,0,0) b18 <- c(0,0,1,0,0,0,0) b19 <- c(0,1,0,0,0,1,0) b20 <- c(0,1,0,0,0,1,0) b21 <- c(0,0,0,1,0,1,1) b22 <- c(1,0,0,1,0,1,1) b23 <- c(1,0,1,1,0,1,0) bb <- rbind (b1,b2,b3,b4,b5,b6,b7,b8,b9,b10,b11,b12,b13,b14,b15,b16,b17,b18,b19,b20, b21,b22,b23) a <- array(0, c(161,3), list(NULL,c("Subject","Item","Response&...
2006 Dec 31
0
(no subject)
...- c(0,0,0,0,0,0,0) b10 <- c(0,0,0,0,0,0,0) b11 <- c(0,0,0,0,0,0,0) b12 <- c(0,0,0,0,0,0,0) b13 <- c(0,0,0,0,0,0,1) b14 <- c(0,0,0,0,0,0,1) b15 <- c(0,0,0,0,0,1,0) b16 <- c(0,0,0,0,1,0,0) b17 <- c(0,0,0,1,0,0,0) b18 <- c(0,0,1,0,0,0,0) b19 <- c(0,1,0,0,0,1,0) # differs b20 <- c(0,1,0,0,0,1,0) b21 <- c(0,0,0,1,0,1,1) b22 <- c(1,0,0,1,0,1,1) b23 <- c(1,0,1,1,0,1,0) bb <- rbind(b1,b2,b3,b4,b5,b6,b7,b8,b9,b10,b11,b12,b13,b14,b15,b16,b17,b18,b19,b20,b21,b22,b23) a <- array(0, c(161,3), list(NULL, c("Subject","Item","Response&qu...
2006 Dec 31
2
zero random effect sizes with binomial lmer [sorry, ignore previous]
...,0) b9 <- c(0,0,0,0,0,0,0) b10 <- c(0,0,0,0,0,0,0) b11 <- c(0,0,0,0,0,0,0) b12 <- c(0,0,0,0,0,0,0) b13 <- c(0,0,0,0,0,0,1) b14 <- c(0,0,0,0,0,0,1) b15 <- c(0,0,0,0,0,1,0) b16 <- c(0,0,0,0,1,0,0) b17 <- c(0,0,0,1,0,0,0) b18 <- c(0,0,1,0,0,0,0) b19 <- c(0,1,0,0,0,1,0) b20 <- c(0,1,0,0,0,1,0) b21 <- c(0,0,0,1,0,1,1) b22 <- c(1,0,0,1,0,1,1) b23 <- c(1,0,1,1,0,1,0) bb <- rbind (b1,b2,b3,b4,b5,b6,b7,b8,b9,b10,b11,b12,b13,b14,b15,b16,b17,b18,b19,b20, b21,b22,b23) a <- array(0, c(161,3), list(NULL,c("Subject","Item","Response&qu...
2002 Oct 17
0
Upgraded to latest cygwin this morning, and ssh refuses to enter binmode. Help! (fwd)
...identifier: cygwin Mount registry: 1 Cygnus registry name: Cygnus Solutions Cygwin registry name: CYGWIN.DLL setup Program options name: Program Options Cygwin mount registry name: b15.0 Build date: Thu Dec 3 20:39:18 PST 1998 CVS taggnu-win32-b20-branch: Shared id: cygwinS1 2975k 1996/12/11 \bin\CYGWIN-old.DLL 446k 1998/12/04 \bin\cygwin1.dll Cygwin DLL version info: DLL version: 2.0.1 DLL epoch: 19 DLL bad signal mask: 19005 API major: 0 API minor: 3 Shared data: 1 DLL...