Displaying 20 results from an estimated 110 matches similar to: "error estimating parameters with mle2"
2012 Apr 19
1
non-numeric argument in mle2
Hi all,
I have some problems with the mle2 function
> RogersIIbinom <- function(N0,attackR3_B,Th3_B)
{N0-lambertW(attackR3_B*Th3_B*N0*exp(-attackR3_B*(24-Th3_B*N0)))/(attackR3_B*Th3_B)}
> RogersII_B <-
mle2(FR~dbinom(size=N0,prob=RogersIIbinom(N0,attackR3_B,Th3_B)/N0),start=list(attackR3_B=1.5,Th3_B=0.04),method="Nelder-Mead",data=dat)
Error in dbinom(x, size, prob, log)
2015 Feb 03
2
Seed in 'parallel' vignette
Hi,
This is most likely only a minor technicality, but I saw the
following: On page 6 of the 'parallel' vignette
(http://stat.ethz.ch/R-manual/R-devel/library/parallel/doc/parallel.pdf),
the random-number generator "L'Ecuyer-CMRG" is said to have seed
"(x_n, x_{n-1}, x_{n-2}, y_n, y_{n-1}, y_{n-2})". However, in L'Ecuyer
et al. (2002), the seed is given with
2012 Jun 07
3
- detecting outliers
Hello all,
I am estimating parameters for regression functions on experimental data.
Functional response of Rogers type II.
I would like to know which points of my dataset are outliers. What is the
best method to do this with R?
I found a method via R help, but would like to know if there are better
methods for my purpose.
Here is the script I us now:
library("mvoutlier")
dat
2012 Apr 03
3
regression for poisson distributed data
Hello all,
I would like to get parameter estimates for different models. For one of
them I give the code in example. I am estimating the parameters (i,j and
k) with the nls function, which sees the error distribution as normal, I
would however like to do the same as nls with the assumption that the
errors are poisson distributed.
Is there a way to do this with R? Are there packages designed
2012 Jun 05
1
- help with the predict function
Hi all,
I would like to predict some values for an nls regression function
(functional response model Rogers type II). This is an asymptotic function
of which I would like to predict the asymptotic value
I estimated the paramters with nls, but can't seem to get predictions for
values of m choice......
This is my script:
RogersII_N <-
2006 Oct 17
1
About compositional data analysis
The compositional data xi=(x_i1,x_i2,...,x_in), for each fixed i , xij>0,
and sum(xij)=1;
I want to compare the mean( u_i) of several groups
i.e.
H0: u_1=u_2=...=u_N
or
H0: u_11=u_21=...=u_N1
Are there any ANOVA tpye tools to do this work in R?
Thanks,
WEN S Q
[[alternative HTML version deleted]]
2012 Apr 02
0
gnm and gnlr3
Hi,
I am quite new to R and would like to do nonlinear regressions with
Poisson distributed data.
I would like to estimate paramters of an equation of this type:
FR = [c*NO * exp(a+b*NO)] / [(c+NO)*(1+exp(a+b*NO))]
a,b and c are parameters, NO are input values
I found both the gnm and gnlr3 function which should be able to do this
regression but I can't manage to make it work.
How can I
2012 Apr 16
0
automatically scan multiple starting values
Hi all,
I am doing nls regression of the Rogers type III equation. However I can't
find good starting values and keep getting the error messages: "Missing
value or an infinity produced when evaluating the model" OR "singular
gradient matrix at initial parameter estimates"
Is there a way to automatically check different starting values and give a
list of values for each
2015 Mar 08
0
Seed in 'parallel' vignette
On Tue, Feb 3, 2015 at 10:39 AM, Marius Hofert
<marius.hofert at uwaterloo.ca> wrote:
> Hi,
>
> This is most likely only a minor technicality, but I saw the
> following: On page 6 of the 'parallel' vignette
> (http://stat.ethz.ch/R-manual/R-devel/library/parallel/doc/parallel.pdf),
> the random-number generator "L'Ecuyer-CMRG" is said to have seed
>
2006 Oct 17
0
Are there ANOVA for compositional data?
The compositional data xi=(x_i1, x_i2,..., x_in), for each fixed i ,
xij>0, and sum(xij)=1;
I want to compare the mean( u_i) of several groups
i.e.
H0: u_1=u_2=...=u_N
or
Hj0: u_1j=u_2j=...=u_Nj
Are there any ANOVA tpye tools to do this work in R?
Thanks,
WEN S Q
[[alternative HTML version deleted]]
2009 Feb 01
2
Extracting Coefficients and Such from mle2 Output
The mle2 function (bbmle library) gives an example something like the
following in its help page. How do I access the coefficients, standard
errors, etc in the summary of "a"?
> x <- 0:10
> y <- c(26, 17, 13, 12, 20, 5, 9, 8, 5, 4, 8)
> LL <- function(ymax=15, xhalf=6)
+ -sum(stats::dpois(y, lambda=ymax/(1+x/xhalf), log=TRUE))
> a <- mle2(LL,
2010 Mar 24
0
optimize a joint lieklihood with mle2
Hi
I'm trying to maximize a joint likelihood of 2 likelihoods (Likelihood 1 and
Likelihood 2) in mle2, where the parameters I estimate in Likelihood 2 go
into the likelihood 1. In Likelihood 1 I estimate the vector logN with
length 37, and for the Likelihood 2 I measure a vector s of length 8.
The values of s in Lieklihood 2 are used in the Likelihood 1.
I have 2 questions:
##1
I manage
2008 Jul 23
1
mle2(): logarithm of negative pdfs
Hi,
In order to use the mle2-function, one has to define the likelihood function
itself. As we know, the likelihood function is a sum of the logarithm of
probability density functions (pdf). I have implemented myself the pdfs
that I am using. My problem is, that the pdfs values are negative and I
cann't take the logarithm of them in the log-likelihood function.
So how can one take the
2008 Nov 19
1
mle2 simple question - sigma?
I'm trying to get started with maximum likelihood estimation with a
simple regression equivalent out of Bolker (Ecological Models and Data
in R, p302).
With this code:
#Basic example regression
library(bbmle)
RegData<-data.frame(c(0.3,0.9,0.6),c(1.7,1.1,1.5))
names(RegData)<-c("x", "y")
linregfun = function(a,b,sigma) {
Y.pred = a+b*x
2010 Feb 01
1
Help with multiple poisson regression with MLE2
Hi, I'm trying to make multiple poisson regressions with the MLE2 command.
I have used the following expression, but I receive an error message:
poisfit <- mle2(y ~ dpois(exp(b0 + b1*x1 + b2*x2)), start=list(b0=1, b1=1,
b2=1), data=data1)
Error in optim(par = c(1, 1, 1), fn = function (p) :
non-finite initial value 'vmmin'
I have changed initial values using coefficient values
2011 Aug 29
1
Bayesian functions for mle2 object
Hi everybody,
I'm interested in evaluating the effect of a continuous variable on the mean
and/or the variance of my response variable. I have built functions
expliciting these and used the 'mle2' function to estimate the coefficients,
as follows:
func.1 <- function(m=62.9, c0=8.84, c1=-1.6)
{
s <- c0+c1*(x)
-sum(dnorm(y, mean=m, sd=s,log=T))
}
m1 <- mle2(func.1,
2008 Sep 19
0
panel data analysis possible with mle2 (bbmle)?
Dear R community,
I want to estimate coefficients in a (non-linear) system of equations using
'mle2' from the "bbmle" package. Right now the whole data is read in as just
one long time series, when it's actually 9 cross sections with 30 observations
each. I would like to be able to test and correct for autocorrelation but
haven't found a way to do this in this package.
2011 Oct 17
1
simultaneously maximizing two independent log likelihood functions using mle2
Hello,
I have a log likelihood function that I was able to optimize using
mle2. I have two years of the data used to fit the function and I would
like to fit both years simultaneously to test if the model parameter
estimates differ between years, using likelihood ratio tests and AIC.
Can anyone give advice on how to do this?
My likelihood functions are long so I'll use the tadpole
2010 Feb 12
1
using mle2 for multinomial model optimization
Hi there
I'm trying to find the mle fo a multinomial model ->*L(N,h,S?x)*. There
is only *N* I want to estimate, which is used in the number of successes
for the last cell probability. These successes are given by:
p^(N-x1-x2-...xi)
All the other parameters (i.e. h and S) I know from somewhere else.
Here is what I've tried to do so far for a imaginary data set:
2012 Jan 12
2
Function accepted by optim but not mle2 (?)
Dear Sir/ Madam,
I'm having trouble de-bugging the following - which works perfectly
well with optim or optimx - but not with mle2.
I'd be really grateful if someone could show me what is wrong. Many
thanks in advance. JSC:
gompertz<- function (x,t=data)
{
a3<-x[1]
b3<-x[2]
shift<-data[1]
h.t<-a3*exp(b3*(t-shift))