Displaying 20 results from an estimated 41 matches for "conlin".
Did you mean:
colin
2012 Mar 21
1
nlme error on dimensions in multiplication
Hello R users,
When trying to fit a nonlinear mixed model to a respiration time series,
I get the following error message:
Error in recalc.varFunc(object[[i]], conLin) :
dims [product 30] do not match the length of object [34]
In addition: Warning message:
In conLin$Xy * varWeights(object) :
longer object length is not a multiple of shorter object length
Below is an example that generates this message on
Windows XP
R 2.14.0
nlme 3.1-103
---
library(nlme)
#...
2009 Jan 22
1
convergence problem gamm / lme
...ind regards, Geert
>
gamm3<-gamm(count~offset(offsetter)+s(lon,lat),
random=list(code_tripnr=~1),family="poisson", correlation = corExp(1,
form=~X + Y),nite
rPQL=200)
Maximum number of PQL iterations: 200
iteration 1
iteration 2
Error in recalc.corSpatial(object[[i]],
conLin) :
NA/NaN/Inf in foreign function call (arg 1)
> gamm3<-gamm(count~offset(offsetter)+s(lon,lat,k=c(1,1)),random=list(code_tripnr=~1),family="poisson",
niterPQL=200)
Maximum number of PQL iterations: 200
iteration 1
iteration 2
Error in lme.formula(fixed = fixed, random...
2007 Aug 07
2
GLMM: MEEM error due to dichotomous variables
I am trying to run a GLMM on some binomial data. My fixed factors include 2
dichotomous variables, day, and distance. When I run the model:
modelA<-glmmPQL(Leaving~Trial*Day*Dist,random=~1|Indiv,family="binomial")
I get the error:
iteration 1
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
>From looking at previous help topics,(
http://tolstoy.newcastle.edu.au/R/help/02a/4473.html)
I gather this is because of the dichotomous predictor variables - what
approach should I take to avoid this problem?
Thanks,...
2005 Aug 18
2
lme model: Error in MEEM
...rvations, each observation consisting of a
reaction-time measure (RT) and an activation maesure (betadlpcv).
since we want to analyze the influence of (age-)group and RT on the
activation, we call:
lme(betadlpcv ~ RT*group, data=our.data, random=~ RT |subject)
this yields:
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
In addition: Warning message:
Fewer observations than random effects in all level 1 groups in:
lme.formula(betadlpcv ~ RT * group, data = patrizia.data, random = ~RT |
what's the problem here?
thanks for your kind help
c...
2003 May 28
1
Bradley Terry model and glmmPQL
Dear R-ers,
I am having trouble understanding why I am getting an error using glmmPQL (library MASS).
I am getting the following error:
iteration 1
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
The long story:
I have data from an experiment on pairwise comparisons between 3 treatments (a, b, c). So a typical run of an experiment involves a rater choosing between a versus b, b versus c, or a versus c. The response...
2003 May 30
1
Error using glmmPQL
....resource,],
+ na.action=na.omit,
+ niter=50,
+ family=binomial(link=probit))
iteration 1
iteration 2
iteration 3
iteration 4
iteration 5
iteration 6
iteration 7
iteration 8
Error in logLik.reStruct(object, conLin) :
NA/NaN/Inf in foreign function call (arg 3)
The traceback() output is very long, so I won't post it, but you can see
it here:
http://www.unc.edu/~aperrin/stuff/diagnostics
Thanks,
Andy Perrin
----------------------------------------------------------------------
Andrew J Perrin -...
2005 Aug 03
1
glmmPQL error in logLik.reStruct
Dear R users,
I'm attempting to fit a GLM with random effects using the tweedie family
for the error structure. I'm getting the error:
iteration 1
Error in logLik.reStruct(object, conLin) :
NA/NaN/Inf in foreign function call (arg 3)
I'm running V2.1.0
I notice from searching the lists that the same error was reported in
May 2004 by Spencer Graves, but no-one was able to offer any
suggestions. Running the sample code that he provided also still
produces the same erro...
2011 Oct 05
1
Difficulty with lme
Hi all,
I'm having some difficulty with lme. I am currently trying to run the
following simple model
anova(lme(x ~ f1 + f2 + f1:f2, data=m, random=~1|r1))
Which is currently producing the error
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
x is a numeric vector containing 194 observations. f1 is a factor vector
containing two levels, and f2 is a different factor vector containing 5
different levels. R1 is a another factor vector containing 13 different
levels, and...
2006 Jan 13
1
glmmPQL: Na/NaN/Inf in foreign function call
I'm using glmmPQL, and I still have a few problems with it.
In addition to the issue reported earlier, I'm getting the following
error and I was wondering if there's something I can do about it.
Error in logLik.reStruct(object, conLin) : Na/NaN/Inf in foreign
function call (arg 3)
... Warnings:
1: Singular precistion matrix in level -1, block 4
(...)
4: ""
The interaction terms are
primed ~ log(dist) * role
random = ~ dist | target.utt / prime.utt
The family is binomial (logit).
I ensured that log(dist) is alway...
2010 Aug 31
1
any statement equals to 'goto'?
...m2)$logLik)
if (i==1 & j==2) results <- result
if (i!=1 | j!=2) results <- rbind(results, result)
}
-----------------------------------------------------------------------------------------------------
after submitting this code, I got the error message saying "Error in
MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1", I know this might be some
issue due to the missing values. what I want to do is to skip the 'bad'
variable, for example, I got this error message when j=116, so I just wanna
ignore variable116, is there a statement tha...
2006 Oct 09
1
split-plot analysis with lme()
...48534 0.2724
nitro 3 45 37.68560 <.0001
Variety:nitro 6 45 0.30282 0.9322
# Excellent! However ---
> fit2 <- lme(yield ~ Variety*nitro, random=~1|Block/Variety, subset=
+ !(Variety == "Golden Rain" & nitro == "0"))
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
--
************************************************
* I.White *
* University of Edinburgh *
* Ashworth Laboratories, West Mains Road *
* Edinburgh EH9 3JT...
2003 Sep 03
1
glmmPQL probelm
...gize if the same mail arrives multiple times. Recently I
had some probelms sending my e-mails to the list.
I encountered a problem when running glmmPQL procuedure doing multilevel
modeling with a dichotomous outcome.
Those are the two error messages I usually get:
Error in logLik.reStruct(object, conLin) :
NA/NaN/Inf in foreign function call (arg 3)
Error in solve.default(pdMatrix(a, fact = TRUE)) :
Lapack routine dgesv: system is exactly singular
The trick is that the model is a part of a simualtion run, which uses the
same starting variance covariance matrix as a source for a m...
2012 Jan 06
1
lme model specification problem (Error in MEEM...)
...ubj=factor(rep(1:16,each=2)))
d$y <- rnorm(32) + rnorm(length(levels(d$subj)))[d$subj]
anova(lme(y~x,random=~1|subj,data=d)) ## works
anova(lme(y~as.factor(x),random=~1|subj,data=d)) ## works
anova(lme(y~x+as.factor(x),random=~1|subj,data=d)) ## fails:
# Error in MEEM(object, conLin, control$niterEM) :
# Singularity in backsolve at level 0, block 1
summary(aov(y~x+as.factor(x)+Error(subj),data=d)) ## works:
# Error: subj
# Df Sum Sq Mean Sq F value Pr(>F)
# x 1 8.434 8.434 4.780 0.0493 *
# as.factor(x) 2 10.459 5.230 2.964 0.0900 .
#...
2012 Apr 18
1
Add covariate in nlme?
...4*TEMP.K)) * exp(eps)) * time),
data = Parameterg,
fixed=list(A0+Ea~1,A1~Process),
random=eps~1,
start=c(93, 92, 34.5,37),
control=list(msVerbose=TRUE, maxIter = 200),
verbose=TRUE, method="REML",
na.action=na.pass)
this fit give the following error:
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
HOWEVER, in SAS the same model with covariate is WORKING!
When I'm changing the fixed part in nmle as follows
fixed=list(A0+Ea~1,A1~1|Process),
then the following error is popping up:
Error in contr.treatment(n = 0L) :
n...
2007 Nov 04
1
Help in error of mixed models
...lt;-c("id","Modality","logit","var.logit","dis","non.dis")
data.bi<-rbind(data.S,data.E)
require(nlme)
lme(logit~dis*Modality+non.dis*Modality, random=~dis|id+non.dis|
id,data=data.bi)
but i recive a erro msg :
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
How in solve this problem? Whats is wrong?
Thanks in advance
--
Bernardo Rangel Tura, M.D,Ph.D
National Institute of Cardiology
Brazil
2009 Jul 10
1
problems with contrast matrix
...avelengths
colnames(cmat.r) <- c(".L",".Q",".mid",".inter",".extr")
contrasts(ordered(datamic$WA)<- cmat.r
When I run the lme models, for all models involving WA, I get an error message (approximate English translation):
Error in MEEM(object, conLin, control$niterEM) :
Singularity encountered in inverse resolution in level 0, block 1
When I run the lmer models, for all models involving WA, I get an error message (approximate English translation):
Warning message:
In mer_finalize(ans) : gr cannot be computed at initial par (65)
What is/are...
2011 Mar 08
1
NaNs in Nested Mixed Model
...in the
host plant is important, but "species" is of course a factor that
structures genetic diversity.
I thought the below model would be appropriate:
> model<-lme(Nymphs~Species*Genotype,random=~1|Species/Genotype)
...but I then get the error message "Error in MEEM(object, conLin,
control$niterEM) : Singularity in backsolve at level 0, block 1"
I then tried to remove "Genotype" from the fixed factors, but then I
get the error message "NaNs produced".
> model<-lme(Nymphs~Species,random=~1|Species/Genotype)
> summary(model)
Linear mixed-eff...
2006 Aug 18
1
multivariate analysis by using lme
...ontrasts=c(factor="contr.treatment",ordered="contr.poly"));
tmp$inter <- factor(tmp$inter); contrasts(tmp$inter)
# perform multivariate analysis and test interaction effect
m1 <- summary(lme(two~res1+res2+inter, random=~1|id, data=tmp))
## Error in MEEM(object, conLin, control$niterEM) :
## Singularity in backsolve at level 0, block 1
Unfortunately, I have been unable to get it work. If I removed these two
dummy variables like this:
m2 <- summary(lme(two~inter, random=~1|id, data=tmp))
I did get some outputs, but these outputs in the mode...
2017 May 10
2
bug report: nlme model-fitting crashes with R 3.4.0
...ata = 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 + Sex, data = Orthodont,
correlation = corCompSy...
2003 May 16
0
glmmPQL, NA/NaN/Inf in foreign function call (arg 3)
...m-ave(wom,est) )* ave(wom,est) ,
+ random = ~ I( age-ave(age,est) ) +
+ I( wom-ave(wom,est) ) | est,
+ family=quasipoisson,
+ data=mydata
iteration 1
Error in logLik.reStruct(object, conLin) :
NA/NaN/Inf in foreign function call (arg 3)
R>
Which function call "NA/NaN/Inf in foreign function call (arg 3)" refers to?
thanks
mahmood arai
http://www.ne.su.se/~ma