search for: cd4

Displaying 20 results from an estimated 25 matches for "cd4".

Did you mean: cd
2007 Mar 02
0
LIMMA contrast.matrix
...s Guide 5 January 2007 PDF version. For the example show in Section 7.4 DIRECT TWO-COLOR DESIGNS (pgs. 33-34), I could not grasp the rationale in developing the contrast.matrix with these R statements (">" indicates the R command prompt): > contrast.matrix <- cbind("CD8-CD4"=c(1,0),"DN-CD4"=c(0,1),"CD8-DN"=c(1,-1)) How do we get that numbers (1,0) (0,1) and (1,-1)? This knowledge is critical to develop the correct contrasts. I would like to extend properly this concept to my experiments. Thank you very much. Roger...
2011 Mar 18
1
PREDICTIONS from a PIECEWISE LINEAR (mixed) MODEL: THEY AIN'T LINEAR BETWEEN BREAK POINTS!!
...ter the break point is not straight at all, instead behaves like if it was a hig order polynomial or something similar!!!! I attach the codes below, hoping someone can point me the mistake.... I sincerely express many thanks in advance ...... Federico Bonofiglio frame3<-data.frame(id,chol,cd4,rt,sex,age, nadir,pharmac2,hbs,hcv,resp2, hivbl,switch) # I run a model specifing the function (t-t*)+ = 0 if t<=t* AND (t-t*)+ = t if t>t* with the following syntax, emulating MJ Crawley (The R book 2007, Wiley), # rt+rt*(rt>15) I run the model, is a mixed effect one..........
2011 Feb 08
3
intervals {nlme} lower CI greater than upper CI !!!????
Hi folks... check this out.. > GLU<-lme(gluc~rt*cd4+sex+age+rf+nadir+pharmac+factor(hcv)+factor(hbs)+ + haartd+hivdur+factor(arv), + random= ~rt|id, na.action=na.omit) > intervals(GLU)$fixed lower est. upper (Intercept) 67.3467070345 7.362307e+01 7.989944e+01 rt *0.0148050160* 6.249...
2011 Dec 13
8
How to compute 95%CI for OR from logistic regression?
Hi all: My data has 3 variables: age(3levels : <30y=1 30-50y=2, >50y=3) gender(Male=0, Female=1) CD4 cell count(raw lab measurement) y(1:death 0:alive) I perform logistic regression to find out the factors that influence y. result<-glm(y ~ factor(age) + factor(gender) + CD4,family = binomial) >From the result,I can get OR(Odds Ratio) of gender via exp(Estimate of Female, since Male i...
2011 Jun 28
1
About the covariant
Hi all,I have some questions about the covariants of regression. My target: To explore the trend of CD4 level through a period of time. Response variable: CD4 count Explanatory variable:time Also, the demology information is available,such as gender,occupation,income level... Q1,Are these variables of demology information called covariant? Q2,How can I correct the impact of "covariant" s...
2011 Jul 26
3
a question about glht function
Hi all: There's a question about glht function. My data:data_ori,which inclue CD4, GROUP,time. f_GROUP<-factor(data_ori$GROUP) f_GROUP is a factor of 3 levels(0,1,2,3) result <- lme(sqrt(CD4) ~ f_GROUP*time ,random = ~time|ID,data=data_ori) glht(result, linfct = mcp(f_GROUP="Tukey") ) Error in `[.data.frame`(mf, nhypo[checknm]) : undefined columns selected...
2011 Feb 06
1
random interaction effect in lmer
Hi dears while modeling an interaction random effect in lmer i receive the instantaneous error message > ldlM4<-lmer(ldl~rt*cd4+age+rf+pharmac+factor(hcv)+ + hivdur+(rt:cd4|id),na.action=na.omit,REML=F) *Warning message: In mer_finalize(ans) : false convergence (8) * I think the matter lies in syntax, 'cause i sistematically receive the same message even when changing response... PS: the above model runs quite well in l...
2002 Sep 09
1
Plots by subject
...per subject). (I thought this may be why the 'split' and 'for' functions didn't do it for me.) This works one subject: pt <- ID == '1' par(oma=c(0,2,0,3)) plot(VISITWK[pt], T4[pt], ylim=c(0,500), xlim=c(0,50), xlab='Visit week', type='b', ylab='CD4 count (cells/ul) [-o-]') par(new=T) plot(VISITWK[pt], LOG.BDUS[pt], ylim=c(1,6), xlim=c(0,50), pch='+', axes=F, ylab='', type='b', xlab='', main='Viral load and CD4 for ID=1') axis(4) mtext("Viral load (log10) [-+-]",4, outer=T) savePlot(filena...
2006 Jan 31
1
Test Failed for CD3 and CD4
hi guys, I dont know if my burner here got a problem. Im downloaded the iso's for cd 3 and 4 thrice and burned it on the cd thrice also. but when i test the cd's they failed. But calculating the checksum was ok. any suggestions ? --------------------------------- Do you Yahoo!? With a free 1 GB, there's more in store with Yahoo! Mail. -------------- next part --------------
2012 May 30
0
anova.coxph for multiple events model
...events model using coxph. I need to choose which covariates stay in the final model and i'm using anova but it seems that it doesn't work with robust variances as a error message appears when I try to do it: /PWPfit<-coxph(Surv(ini,fim,status)~Sexo+Transmissao+Regime+HAART+Drogas+Psi+ + CD4+CV+Neo+IO+cluster(idPARTICIPANTE)+strata(Estrato),data=PWP) > anova(PWPfit) Error in anova.coxph(PWPfit) : Can't do anova tables with robust variances / However when I fit two different nested models the function anova seems to work: /> PWPfit<-coxph(Surv(ini,fim,status)~Sexo+Tra...
2011 Jul 25
1
lme convergence error
Hello, I am working from a linux 64 machine on a server with R-2.12 (I can't update to 2.13). I am iterating through many linear mixed models for longitudinal data and I occasionally receive the following convergence error: > BI.lme <- lme(cd4 ~ time + genBI + genBI:time + C1 + C2 + C11 + C12, random =~ 1 + time | IID, data = d) Error in lme.formula(cd4 ~ time + genBI + genBI:time + PC1 + : nlminb problem, convergence error code = 1 message = false convergence (8) >From iteration to iteration, genBI is the only variable which c...
2002 Nov 20
0
Plots by subject
...elped me with). So the whole function for one patient is: { # Overlay plot lab <-read.xport('lab') attach(lab) celld <- as.date(CELLDATE) vld <- as.date(VIRDATE) gtd <- as.date(GTDATE) par(mar=c(2,6,1,6) + 0.1) plot(celld, T4, ylim=c(0,800), pch=4, type='o', ylab='CD4 count (cells/ul) [-x-]', xlab=??) par(new=T) plot(gtd, Y, ylim=c(0,800), type='p', pch=8, axes=F, ylab='', xlab='', cex=1.4) par(new=T) plot(vld, VL, axes=F, ylim=c(0,6), lty=5, ylab='', type='c', xlab='') axis(4) par(new=T) plot(vld, VL0, axes=...
2009 Apr 16
1
How can I catch errors thrown from c via the Rcpp error() function?
...#39;blah'))) Error : blah > x [1] "Error : blah\n" attr(,"class") [1] "try-error" 2. This is an example using flowClust (using real data, set up to guarantee that the error is thrown): > x <- try(res30 = flowClust(tFrame, K=30, B=1000, varNames=c('CD4', 'CD8','KI67', 'CD45RO', 'CD28', 'CD57', 'CCR5', 'CD19', 'CD27', 'CCR7', 'CD127'))) Error in flowClust(tFrame, K = 30, B = 1000, varNames = c("CD4", "CD8", : The covariance matrix is near si...
2009 Nov 03
2
about the cox result
Hi all: I finished cox analysis like this: fit_cox<-coxph(Surv(dat$Time, dat$death) ~ dat$CD4 + strata(dat$gender),data=dat); > fit_cox Call: coxph(formula = Surv(data_ori$Time, data_ori$death) ~ data_ori$drug + strata(data_ori$gender), data = data_ori) coef exp(coef) se(coef) z p data_ori$drugddI 0.216 1.24 0.146 1.47 0.14 Likelihood ratio test=2.17...
2005 Feb 05
1
Addons
Hi All, A newbie question :-( How do I go about installing the add-ons found in CD4? Many thanks, Joao -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://lists.centos.org/pipermail/centos/attachments/20050205/8c4f13bc/attachment-0005.html>
2011 Jul 18
1
question about linear mixed model
Hi all: I have a question about linear mixed model. my linear mixed model with randomized slope and intercept with interaction of time and group(g1,g2,g3): model<- glmmPQL(log10(CD4) ~ time + factor(group)+ time:factor(group), random = ~time|id) What I get is only the main and interaction of time and group.My question is: 1. How can I get the g1,g2,g3's slope respectively?In other words,how can I get the slope of g1,the slope of g2,and the slope of g3? 2.How can I pair-...
2011 Mar 22
1
how to convert a data.frame to a list of dist objects for individual differences MDS?
...ordered by columns in the lower triangle of each distance matrix. > helm.raw <- read.table("http://euclid.psych.yorku.ca/datavis/Private/mdshelm.dat", header=TRUE, row.names=1) > head(helm.raw) N1 N2 N3 N4 N5 N6a N6b N7 N8 N9 N10 CD1 CD2a CD2b CD3 CD4 AC 6.8 5.9 7.1 7.5 6.6 5.2 5.8 6.2 7.5 6.0 9.2 11.5 9.3 9.0 10.4 9.9 AE 12.5 11.1 10.2 10.3 10.5 9.4 10.5 10.8 9.1 9.4 10.8 13.1 10.7 10.0 12.4 13.2 AG 13.8 18.8 11.1 10.7 10.2 11.4 13.4 9.9 10.2 9.5 9.7 12.6 10.7 10.4 12.8 12.3 AI 14.2 17.3 12.5 11.6 9.6 13.3 14.0 11.1 12.1 9....
2011 Feb 08
0
glht{multcomp} : use with lme {nlme}
Hi dears, I do > CHOL<-lme(chol~rt*cd4+sex+age+rf+nadir+pharmac+factor(hcv)+factor(hbs)+ haartd+hivdur+factor(arv), random= ~rt|id, na.action=na.omit) ...runs sweet,..then ....try a multicomparisons approach for the categorical rf > summary(glht(CHOL, linfct=mcp(rf="Tukey"))) * Error in model.frame.default(object, data,...
2011 Jul 02
0
The test of randomized slopes(intercepts)
Hi all: I perform the linear mixed model for 300 persons, y is CD4 count,x is time. I randomized slope and intercept,so I can get 300 slopes and 300 intercepts.Now I wanna test wheter the variance of 300 slopes and 300 intercepts differs from zero. If the variance of 300 slopes(or intercepts) differs from zero at 0.05 significant level,I should randomize the slo...
2005 Feb 18
0
xdelta results between beta and rc1 isos.
xdelta results: 666198016 CentOS-4.0-Beta-Binary-CD1.iso 635330560 CentOS-4.0-Beta-Binary-CD2.iso 661059584 CentOS-4.0-Beta-Binary-CD3.iso 662018048 CentOS-4.0-Beta-Binary-CD4.iso 444139520 CentOS-4.0-Beta-Binary-CD5.iso - 658491392 CentOS-4.0.rc1-i386-bin1of5.iso 611952640 CentOS-4.0.rc1-i386-bin2of5.iso 666099712 CentOS-4.0.rc1-i386-bin3of5.iso 663128064 CentOS-4.0.rc1-i386-bin4of5.iso 360095744 CentOS-4.0.rc1-i386-bin5of5.iso - 522078044 disc1.delta - 144119972 diff 5...