search for: zname

Displaying 14 results from an estimated 14 matches for "zname".

Did you mean: name
2007 May 04
3
Error in if (!length(fname) || !any(fname == zname)) { :
Dear R users, I tried to fit a cox proportional hazard model to get estimation of stratified survival probability. my R code is as follows: cph(Surv(time.sur, status.sur)~ strat(colon[,13])+colon[,18] +colon[,20]+colon[,9], surv=TRUE) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed Here colon[,13] is the one that I want to stratify and the others are all coefficients. How can I solve this problem? Thanks a lot!!!!! Grace --------------------------------- [[alternative HTML version deleted]]
2011 Apr 12
2
Model formula for ols function (rms package)
...esented as restricted cubic splines, and also include an interaction as a product of linear terms, but I get an error message. library(rms) d <- data.frame(x1 = rnorm(50), x2 = rnorm(50), y = rnorm(50)) ols(y ~ rcs(x1,3) + rcs(x2,3) + x1*x2, data=d) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed ols(y ~ rcs(x1,3) + rcs(x2,3) + I(x1*x2), data=d) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed I get the same error if I try to fit a model with a quadratic term: ols(y ~ x1 + I(x1^2), data=d) Error...
2001 Feb 10
1
match.call() and do.call()
...includes a variable whose name comes from the caller. so instead of: fit <- glm(formula, poisson(), data, weights = 1-z, ...), i do something like this: fit <- do.call("glm", list(formula=formula, family=poisson(), data=data, weights = call("-", 1, as.name(zname)), ...)) this works ok, but i find that the call component of the fit object returned by glm() has taken things a bit too literally -- it has literals for all of the args in the call, rather than variable and function names as the object returned by the first form above would. in a simpler exampl...
2007 Mar 14
2
ols Error : missing value where TRUE/FALSE needed
I have installed Hmisc and Design. When I use ols, I get the following error message: Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed The model that I am running is: > ecools <- ols(eco$exp ~ eco$age + eco$own + eco$inc + inc2, x=TRUE) I have tried several other combinations of arguments that take TRUE/ FALSE values, but no luck. Ultimately, I am trying to calculate robust...
2005 Feb 12
4
Is is possible to do "shorewall reject 1.1.1.1 tcp 25"
Hello, Is is possible to do "shorewall reject 1.1.1.1 tcp 25" ? So I can dynamically blacklist offensive smtp senders, but only have shorewall reject certain types (smtp) traffic from them? Thanks, Alex Martin http://www.rettc.com
2009 Sep 04
2
lrm in Design package--missing value where TRUE/FALSE needed
...rm.fit (rank= 8 ). Offending variable(s): CovE Error in j:(j + params[i] - 1) : NA/NaN argument >detach(mydata) >lrm(mydata$RC~ mydata$RS+ mydata$Sex+ mydata$CovA+ mydata$CovB+ mydata$CovC+ mydata$CovD+ mydata$CovE,data=mydata,na.action=na.pass) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed I have debugged for a while, but no success. Does anyone know what happens? Thanks, Mike
2009 Jun 25
1
interaction terms formula error
...to do the following: model<- lrm(formula= y ~ A: (B+C) + D + E +...) I've had no problem with adding interaction terms using " * ", but every time I try to use " : ", as in my example, I get an error message like: Error in if (!length(fname) || !any(fname == zname)) { : Missing value where TRUE/FALSE needed I would really appreciate any advice on how to solve this, I don't know what in the notation should be different for different operators. Thanks in advance, kind regards, Alejandra SolĂ­s [[alternative HTML version del...
2010 Jun 07
1
ols function in rms package
...<- rnorm(100, 0, 1) x2 <- rnorm(100, 0, 1) x3 <- rnorm(100, 0, 1) y <- x2 + x3 + rnorm(100, 0, 5) d <- data.frame(x1, x2, x3, y) rm(x1, x2, x3, y) lm(y ~ d[,2] + d[,3], data = d) # This works ols(y ~ d[,2] + d[,3], data = d) # Gives error Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed However, this works: ols(y ~ x2 + d[,3], data = d) The reason I want to do this is to program variable selection for bootstrap model validation. A related question: does ols allow "y ~ ." notation? lm(y ~ ., data = d[, 2:4]) # This works...
2008 Apr 01
1
lrm -interaction without main effect-error message
...uestion but also a statistical. When I do a logistic regression analysis (species distribution modeling) with function lrm (Design package) I get the follwoing error message: > tadl1<-lrm(triad~fd+dista+fd2+dista2+fd:dista+dista:geo2, x=T, y=T) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed The problem seems to be that geo2 (factor variable with 3 levels) is not included as main effect. But when I run the same model with glm it is working properly. However, from an ecological point of view, inclusion of only the interaction term make...
2006 Feb 02
1
error message in cox regression cph()
Hi, I have been trying to get the cph() function of the Design package to work but get an error message I don't understand: Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed I have tried the same for a dummy dataset I made, and than it seems to work fine. However, it doesn't do it for my own data. Does anyone have a clue as to what this message means, whether I have made a mistake somewhere(although it seems ok...
2009 Nov 05
1
help with ols and contrast functions in Design library
...ctor(feature), response=response) I use the ols command to fit the linear model, but I receive the following error. fit <- ols(response ~ feature*group + group/patient, myData) > fit <- ols(response ~ feature*group + group/patient, myData) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed Because of this, I tried using a unique identifier for patient using the following command. myData$group.patient <- with(myData, group:patient)[drop=TRUE] Running the same model with this factor will correct the error, but leaves me with an &...
2007 Jul 31
0
Cox model with interaction
Dear R users, I am trying to fit a Cox model such as: Surv(time,event) ~ X1+X1:X2 or Surv(time,event) ~ X1*X2 -X2, This code is working with coxph but not with cph (nor with psm), and the error message is: Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE is required Any idea about the cause of the problem and how to manage it within the Design library? Thanks a lot for your help. Rosalba Dr. Rosalba Miceli Unit? di Statistica Medica e Biometria Fondazione IRCCS Istituto Nazionale Tumori Via G. Venez...
2010 May 22
0
Modeling time varying effects in with cph: how to ?
...r to use cph because of the rms bootstrap validation facilities. Unfortunately cph doesn't wanto to model an interaction term without the both corresponding main effects: > fit.cph <- cph(TACE.Surv~PS+PS:TIME.start,data=DatasetTACE.imputati) Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed coxph runs without complaining. I could make the design matrix columns by hand, but this is generally not recommended, isn't it? Any sort of comment will be appreciated. Thank you very much. Marco Barb?ra.
2012 Jan 09
0
glmD error
...I(dnorm(relAge*term-round(relAge*term/12)*12,sd=1.2)*as.integer((relAge*term)>3))+ + I(term %in% c(36,60,72,120)) + ,data=conv, + family="quasibinomial") Error in if (!length(fname) || !any(fname == zname)) { : missing value where TRUE/FALSE needed > conv.go <- glm(cbind(go.cnt,tot.cnt-go.cnt)~sn+rcs(relAge,4)+termfac+rate:termfac+ + I(relAge*term>(term-1.25))+I((prevbal/tot.cnt)*1e-4)+prod+newmort+ + I(dnorm(relAge*term-round(relAge*t...