Displaying 20 results from an estimated 500 matches similar to: "anova.lme error"
2011 Sep 12
1
coxreg vs coxph: time-dependent treatment
Dear List,
After including cluster() option the coxreg (from eha package)
produces results slightly different than that of coxph (from survival)
in the following time-dependent treatment effect calculation (example
is used just to make the point). Will appreciate any explaination /
comment.
cheers,
Ehsan
############################
require(survival)
require(eha)
data(heart)
# create weights
2012 Nov 08
2
Comparing nonlinear, non-nested models
Dear R users,
Could somebody please help me to find a way of comparing nonlinear, non-nested
models in R, where the number of parameters is not necessarily different? Here
is a sample (growth rates, y, as a function of internal substrate
concentration, x):
x <- c(0.52, 1.21, 1.45, 1.64, 1.89, 2.14, 2.47, 3.20, 4.47, 5.31, 6.48)
y <- c(0.00, 0.35, 0.41, 0.49, 0.58, 0.61, 0.71, 0.83, 0.98,
2008 Apr 17
1
survreg() with frailty
Dear R-users,
I have noticed small discrepencies in the reported estimate of the 
variance of the frailty by the print method for survreg() and the 
'theta' component included in the object fit:
# Examples in R-2.6.2 for Windows
library(survival) # version 2.34-1 (2008-03-31)
# discrepancy
fit1 <- survreg(Surv(time, status) ~ rx + frailty(litter), rats)
fit1
fit1$history[[1]]$theta
2010 Feb 26
2
Error in mvpart example
Dear all,
I'm getting an error in one of the stock examples in the 'mvpart' package. I tried:
require(mvpart)
data(spider)
fit3 <- rpart(gdist(spider[,1:12],meth="bray",full=TRUE,sq=TRUE)~water+twigs+reft+herbs+moss+sand,spider,method="dist") #directly from ?rpart
summary(fit3)
...which returned the following:
Error in apply(formatg(yval, digits - 3), 1,
2004 Dec 20
2
problems with limma
I try to send this message To Gordon Smyth at smyth at vehi,edu.au but it bounced
back, so here it is to r-help
I am trying to use limma, just downloaded it from CRAN. I use R 2.0.1 on Win XP
see the following:
> library(RODBC)
> chan1 <- odbcConnectExcel("D:/Data/mgc/Chips/Chips4.xls")
> dd <- sqlFetch(chan1,"Raw")   # all data  12000
> #
> nzw <-
2011 Jan 21
2
Looping with incremented object name and increment function
Folks,
I am trying to get a loop to run which increments the object name as part of
the loop.  Here "fit1" "fit2" "fit3" and "fit4" are linear regression models
that I have created.
> for (ii in c(1:4)){
+ SSE[ii]=rbind(anova(fit[ii])$"Sum Sq")
+ dfe[ii]=rbind(summary(fit[ii])$df)
+ }
Error in anova(fit[ii]) : object 'fit' not found
2004 May 07
0
rpart for CART with weights/priors
Hi,
I have a technical question about rpart:
according to Breiman et al. 1984, different costs for misclassification in
CART can be modelled 
either by means of modifying the loss matrix or by means of using different
prior probabilities for the classes, 
which again should have the same effect as using different weights for the
response classes.
What I tried was this:
library(rpart)
2006 Aug 24
2
my error with augPred
Dear all
I try to refine my nlme models and with partial success. The model is 
refined and fitted (using Pinheiro/Bates book as a tutorial) but when 
I try to plot
plot(augPred(fit4))
I obtain
Error in predict.nlme(object, value[1:(nrow(value)/nL), , drop = 
FALSE],  : 
        Levels (0,3.5],(3.5,5],(5,7],(7,Inf] not allowed for 
vykon.fac
>
Is it due to the fact that I have unbalanced
2011 Dec 05
1
about error while using anova function
fit1<-rq(formula=op~inp1+inp2+inp3+inp4+inp5+inp6+inp7+inp8+inp9,tau=0.15,data=wbc)
fit2<-rq(formula=op~inp1+inp2+inp3+inp4+inp5+inp6+inp7+inp8+inp9,tau=0.5,data=wbc)
fit3<-rq(formula=op~inp1+inp2+inp3+inp4+inp5+inp6+inp7+inp8+inp9,tau=0.15,data=wbc)
fit4<-rq(formula=op~inp1+inp2+inp3+inp4+inp5+inp6+inp7+inp8+inp9,tau=0.15,data=wbc)
2005 Feb 14
1
testing equality of variances across groups in lme?
Hello. I am fitting a two-level mixed model which assumes equality of
variance in the lowest-level residuals across groups.  The call is:
 
fit3<-lme(CLnNAR~CLnRGR,data=meta.analysis,
+ na.action="na.omit",random=~1+CLnRGR|study.code)
 
I want to test the assumption of equality of variances across groups at
the lowest level.  Can someone tell me how to do this?  I know that one
2004 Dec 21
0
Fwd: problems with limma
On Wed, December 22, 2004 12:11 am, r.ghezzo at staff.mcgill.ca said:
> ----- Forwarded message from r.ghezzo at staff.mcgill.ca -----
>     Date: Mon, 20 Dec 2004 15:45:11 -0500
>     From: r.ghezzo at staff.mcgill.ca
> Reply-To: r.ghezzo at staff.mcgill.ca
>  Subject: [R] problems with limma
>       To: r-help at stat.math.ethz.ch
>
> I try to send this message To Gordon
2012 Apr 29
0
need help with avg.surv (Direct Adjusted Survival Curve)
Hello R users, 
I am trying to obtain a direct adjusted survival curve. I am sending my whole code (see below). It's basically the larynx cancer data with Stage 1-4. I am using the cox model using coxph option, see the fit3 coxph. When I use the avg.surv option on fit3, I get the following error: "fits<-avg.surv(fit3, var.name="stage.fac", var.values=c(1,2,3,4), data=larynx)
2012 Apr 30
0
need help with avg.surv (Direct Adjusted Survival Curve), Message-ID:
Well, I would suggest using the code already in place in the survival 
package.  Here is my code for your problem.
I'm using a copy of the larynx data as found from the web resources for 
the Klein and Moeschberger book.
larynx <- read.table("larynx.dat", skip=12,
                      col.names=c("stage", "time", "age", "year",
2018 Feb 14
0
Unexpected behaviour in rms::lrtest
Hello.
One of my teaching assistants was experimenting and encountered 
unexpected behaviour with the lrtest function in the rms package. It 
appears that when you have a pair of non-nested models that employ an 
RCS, the error checking for non-nested models appears not to work.
Here is a reproducible example.
 > library(rms)
Loading required package: Hmisc
Loading required package: lattice
2009 Sep 24
4
Action Controller ::MethodNotAllowed
Hi,
Iam getting the following error
ActionController::MethodNotAllowed
Only get, put and delete requests are allowed.
Actually, Iam trying to have multiple actions for a  form to create
new record. The actions for the form are cancel, save, publish and
preview.
here''s the config/routes.rb file code snippet for the relevant
controller - Events
map.resources :events, :member =>
2013 Jul 09
3
fitting log function: errors using nls and nlxb
Hi-
I am trying to fit a log function to my data, with the ultimate goal of
finding the second derivative of the function.  However, I am stalled on
the first step of fitting a curve.
When I use the following code:
FG2.model<-(nls((CO2~log(a*Time)+b), start=setNames(coef(lm(CO2 ~
log(Time), data=FG2)), c("a", "b")),data=FG2))
I get the following error:
Error in
2010 May 03
3
Help needed with legend
Hello,
I am new to R and need some help with the legend. How can I add a legend for
two variables (in two columns) each having multiple values to be explained
in the legend. For example:
Var 1                           Var 2
<symbol> - Higher         <symbol> - Higher
<symbol> - Avg            <symbol> - Avg
<symbol> - Lower         <symbol> - Lower
I know we
2011 May 05
1
Extraction of columns from two matrices
Hi,
I have two matrices with 4885 cols and 36 cols respectively . I would like
to extract these 36 columns from the bigger matrix, the column values are
different but the column names would be the same.Hence based on the names I
would like to perform my operation. So is there any way of extracting this
info in an easy way. I have tried names,which,grep,subset none have worked.
Could someone help
2006 Jun 23
1
How to use mle or similar with integrate?
Hi
I have the following formula (I hope it is clear - if no, I can try to
do better the next time)
h(x, a, b) =
integral(0 to pi/2)
(
  (
    integral(D/sin(alpha) to Inf)
    (
      (
        f(x, a, b)
      )
      dx
    )
  dalpha
)
and I want to do an mle with it.
I know how to use mle() and I also know about integrate(). My problem is
to give the parameter values a and b to the
2011 Jul 18
1
rails server being aborted due to mysql lib file not available
Hi,
My system has the following :
MacOs Leopard
Rails 3
Ruby 1.9
Mysql 5.1.58
mysql2 ruby gems
My problem is that when i give "rails server", the task aborts with
the foll error
rails server/Users/nisha/.rvm/gems/ruby-1.9.2-p180@rails3/gems/
railties-3.0.5/lib/rails/script_rails_loader.rb:11: warning: Insecure
world writable dir /usr/local/bin in PATH, mode 040777