search for: fixdf

Displaying 6 results from an estimated 6 matches for "fixdf".

Did you mean: fitdf
2006 Apr 25
1
summary.lme: argument "adjustSigma"
...a look into the code I found: stdFixed <- sqrt(diag(as.matrix(object$varFix))) if (object$method == "ML" && adjustSigma == TRUE) { stdFixed <- sqrt(object$dims$N/(object$dims$N - length(stdFixed))) * stdFixed } tTable <- data.frame(fixed, stdFixed, object$fixDF[["X"]], fixed/stdFixed, fixed) To my understanding, only the standard error for the fixed coefficients is adapted and not the residual standard error. Therefore only the tTable of the output is affected by the argument "adjustSigma", but not the estimate for residual st...
2008 Apr 16
2
Post hoc tests with lme
...vector > glh.test(fm, rbind(c("TypeT1"=1), c("TypeT2"=1))) Error in glh.test(fm, rbind(c(TypeT1 = 1), c(TypeT2 = 1))) : Only defined for lm,glm objects > library(doBy) > esticon(fm, rbind(c("TypeT1"=1), c("TypeT2"=1))) Error in t(abs(t(tmp) * obj$fixDF$X)) : dims [product 2] do not match the length of object [4] In addition: Warning message: In esticon.lme(fm, rbind(c(TypeT1 = 1), c(TypeT2 = 1))) : The esticon function has not been thoroughly teste on 'lme' objects > library(car) > linear.hypothesis(fm, rbind(c("TypeT1&quo...
2006 Apr 23
1
lme: null deviance, deviance due to the random effects, residual deviance
...t; "coefficients" [5] "varFix" "sigma" "apVar" "logLik" [9] "numIter" "groups" "call" "method" [13] "fitted" "residuals" "fixDF" "family" so no $null.deviance and $deviance elements as in glm objects... I tried to find out an answer on R-help & Pineihro & Bates (2000). Partial success only: - null deviance: Response: possibly yes: see http://tolstoy.newcastle.edu.au/R/help/05/12/17796.html...
2017 May 10
2
bug report: nlme model-fitting crashes with R 3.4.0
...ng system fm2 <- lme(distance ~ age + Sex, data = Orthodont, random = ~ 1) # Error in array(c(rep(1, p), .C(inner_perc_table, as.double(X), as.integer(unlist(grps)), : # object 'inner_perc_table' not found # #Upon debugging, this error is thrown with line 135 of lme.formula() code. # #fixDF <- getFixDF(X, grps, attr(lmeSt, "conLin")$dims$ngrps, lme(distance ~ age + Sex, data = Orthodont, random = ~ 1|Subject) # Error in array(c(rep(1, p), .C(inner_perc_table, as.double(X), as.integer(unlist(grps)), : # object 'inner_perc_table' not found gls(distance ~ age + S...
2003 Jul 04
0
degrees of freedom in nlme() (PR#2384)
...ot;)) tryerror <- try(fit.nlme <- nlme(y ~ a + x, fixed= a~1, random=x~1|id, data=data, start=list(fixed=c(a=2), random=list(id=initx)),method="ML")) DF[i] <- ifelse(attr(tryerror,"class")[1]=="try-error",NA,fit.nlme$fixDF$X) } names(DF) <- 1:nseeds DF ########### -- Jerome Asselin (Jérôme), Statistical Analyst British Columbia Centre for Excellence in HIV/AIDS St. Paul's Hospital, 608 - 1081 Burrard Street Vancouver, British Columbia, CANADA V6Z 1Y6 Email: jerome@hivnet.ubc.ca Phone: 604 806-9112 Fax: 60...
2017 May 11
0
bug report: nlme model-fitting crashes with R 3.4.0
...~ age + Sex, data = Orthodont, random = ~ 1) > > # Error in array(c(rep(1, p), .C(inner_perc_table, as.double(X), as.integer(unlist(grps)), : > # object 'inner_perc_table' not found > # > #Upon debugging, this error is thrown with line 135 of lme.formula() code. > # > #fixDF <- getFixDF(X, grps, attr(lmeSt, "conLin")$dims$ngrps, > > lme(distance ~ age + Sex, data = Orthodont, random = ~ 1|Subject) > > # Error in array(c(rep(1, p), .C(inner_perc_table, as.double(X), as.integer(unlist(grps)), : > # object 'inner_perc_table' not found...