Displaying 20 results from an estimated 900 matches similar to: "Simulating inhomogeneous Poisson process without loop"
2013 Feb 12
0
error message from predict.coxph
In one particular situation predict.coxph gives an error message. Namely: stratified data, predict='expected', new data, se=TRUE. I think I found the error but I'll leave that to you to decide.
Thanks,
Chris
######## CODE
library(survival)
set.seed(20121221)
nn <- 10 # sample size in each group
lambda0 <- 0.1 # event rate in group 0
lambda1 <- 0.2 # event rate in group 1
2010 Nov 15
2
Zero truncated Poisson distribution & R2WinBUGS
I am using a binomial mixture model to estimate abundance (N) and
detection probability (p) using simulated count data:
-Each site has a simulated abundance that follow a Poisson
distribution with lambda = 5
-There are 200 simulated sampled sites
-3 repeated counts at each site
- only 50 percent of the animals are counted during each count (i.e,
detection probability p =0.5, see codes)
We removed
2009 May 16
1
maxLik pakage
Hi all;
I recently have been used 'maxLik' function for maximizing G2StNV178 function with gradient function gradlik; for receiving this goal, I write the following program; but I have been seen an error in calling gradient function;
The maxLik function can't enter gradlik function (definition of gradient function); I guess my mistake is in line ******** ,that the vector ‘h’ is
2009 Jan 05
1
transform R to C
Dear R users,
i would like to transform the following function from R-code to C-code and call it from R in order to speed up the computation because in my other functions this function is called many times.
`dgcpois` <- function(z, lambda1, lambda2)
{
`f1` <- function(alpha, lambda1, lambda2)
return(exp(log(lambda1) * (alpha - 1) - lambda2 * lgamma(alpha)))
`f2` <-
2006 Jul 20
1
Loss of numerical precision from conversion to list ?
I?m working on an R-implementation of the simulation-based finite-sample null-distribution of (R)LR-Test in Mixed Models (i.e. testing for Var(RandomEffect)=0) derived by C. M. Crainiceanu and D. Ruppert.
I'm in the beginning stages of this project and while comparing quick and dirty grid-search-methods and more exact optim()/optimize()-based methods to find the maximum of a part of the
2008 Sep 12
1
Error in "[<-"(`*tmp*`, i, value = numeric(0)) :
I use "while" loop but it produces an errro. I have no idea about this.
Error in "[<-"(`*tmp*`, i, value = numeric(0)) :
nothing to replace with
The problem description is
The likelihood includes two parameters to be estimated: lambda
(=beta0+beta1*x) and alpha. The algorithm for the estimation is as
following:
1) with alpha=0, estimate lambda (estimate beta0
2006 Jul 07
1
convert ms() to optim()
How to convert the following ms() in Splus to Optim in R? The "Calc" function is also attached.
ms(~ Calc(a.init, B, v, off, d, P.a, lambda.a, P.y, lambda.y,
10^(-8), FALSE, 20, TRUE)$Bic,
start = list(lambda.a = 0.5, lambda.y = 240),
control = list(maxiter = 10, tol = 0.1))
Calc <- function(A.INIT., X., V., OFF., D.,
P1., LAMBDA1., P2., LAMBDA2.,
TOL., MONITOR.,
2007 Mar 06
2
Estimating parameters of 2 phase Coxian using optim
Hi,
My name is Laura. I'm a PhD student at Queen's University Belfast and have
just started learning R. I was wondering if somebody could help me to see
where I am going wrong in my code for estimating the parameters [mu1, mu2,
lambda1] of a 2-phase Coxian Distribution.
cox2.lik<-function(theta, y){
mu1<-theta[1]
mu2<-theta[2]
lambda1<-theta[3]
2008 Sep 19
2
Error: function cannot be evaluated at initial parameters
I have an error for a simple optimization problem. Is there anyone knowing
about this error?
lambda1=-9
lambda2=-6
L<-function(a){
s2i2f<-(exp(-lambda1*(250^a)-lambda2*(275^a-250^a))
-exp(-lambda1*(250^a)-lambda2*(300^a-250^a)))
logl<-log(s2i2f)
return(-logl)}
optim(1,L)
Error in optim(1, L) : function cannot be evaluated at initial parameters
Thank you in advance
--
View this
2007 Sep 10
2
Are the error messages of ConstrOptim() consisten with each other?
Dear Friends.
I found something very puzzling with constOptim(). When I change the
parameters for ConstrOptim, the error messages do not seem to be
consistent with each other:
> constrOptim(c(0.5,0.3,0.5), f=fit.error, gr=fit.error.grr, ui=ui,ci=ci)
Error in constrOptim(c(0.5, 0.3, 0.5), f = fit.error, gr = fit.error.grr, :
initial value not feasible
> constrOptim(c(0.5,0.9,0.5),
2011 May 01
1
Different results of coefficients by packages penalized and glmnet
Dear R users:
Recently, I learn to use penalized logistic regression. Two packages
(penalized and glmnet) have the function of lasso.
So I write these code. However, I got different results of coef. Can someone
kindly explain.
# lasso using penalized
library(penalized)
pena.fit2<-penalized(HRLNM,penalized=~CN+NoSus,lambda1=1,model="logistic",standardize=TRUE)
pena.fit2
2006 Oct 02
1
multilevel factor model in lmer
Hello --
I am curious if lmer can be used to fit a multilevel factor model such as a
two-parameter item response model. The one parameter model is
straightforward. A two-factor model requires a set of factor loadings
multiplying a single random effect. For example, a logit model for the ith
subject responding correctly to the jth item (j=1,..,J) is
logit[p(ij)] = a1*item1(i) + ... + aJ *
2001 Sep 14
1
Supply linear constrain to optimizer
Dear R and S users,
I've been working on fitting finite mixture of negative exponential
distributions using maximum likelihood based on the example given in MASS.
So far I had much success in fitting two components. The problem started
when I tried to extend the procedure to fit three components.
More specifically,
likelihood = sum( ln(c1*exp(-x/lambda1)/lambda1 +
c2*exp(-x/lambda2)/lambda2
2006 Nov 24
2
low-variance warning in lmer
For block effects with small variance, lmer will sometimes
estimate the variance as being very close to zero and issue
a warning. I don't have a problem with this -- I've explored
things a bit with some simulations (see below) and conclude that
this is probably inevitable when trying to incorporate
random effects with not very much data (the means and medians
of estimates are plausibly
2003 Jun 14
2
A sapply() funny.
The sapply function is refusing to return a result for what seem to
me to be mysterious reasons. Here is a toy example:
set.seed(111)
X <- list(x=runif(20),y=runif(20))
rvec <- seq(0.01,0.15,length=42)
foo <- function(x,X,cc) {
mean((X$x)^x + (X$y)^cc)
}
bar <- function(x,a,b){a+b*x}
try.b <- sapply(rvec,bar,a=1,b=2) # This runs without a problem and
2008 Sep 11
0
Loop for the convergence of shape parameter
Hello,
The likelihood includes two parameters to be estimated: lambda
(=beta0+beta1*x) and alpha. The algorithm for the estimation is as
following:
1) with alpha=0, estimate lambda (estimate beta0 and beta1 via GLM)
2) with lambda, estimate alpha via ML estimation
3) with updataed alpha, replicate 1) and 2) until alpha is converged to a
value
I coded 1) and 2) (it works), but faced some
2008 Mar 21
1
(no subject)
Hi, I am fairly new to R, and am stuck.
I want to write an R function with argument n that returns a vector of length n with n simulated observations from the double exponential distribution with density: ??g(y) = 1/2e^-y
?
For the double exponential, I want to generate y~Exp(1) and then take ?y with probability 0.5
?
Does anyone know how I can do this in R?
Thanks!
Fran
[[alternative
2006 Jul 14
1
Optim()
Dear all,
I have two functions (f1, f2) and 4 unknown parameters (p1, p2, p3, p4). Both
f1 and f2 are functions of p1, p2, and p3, denoted by f1(p1, p2, p3) and
f2(p1,p2,p3) respectively.
The goal is to maximize f1(p1, p2, p3) subject to two constraints:
(1) c = k1*p4/(k1*p4+(1-k1)*f1(p1,p2,p3)), where c and k1 are some known
constants
(2) p4 = f2(p1, p2, p3)
In addition, each parameter
2009 Aug 25
1
Elastic net in R (enet package)
Dear R users,
I am using "enet" package in R for applying "elastic
net" method. In elastic net, two penalities are applied one is lambda1 for
LASSO and lambda2 for ridge ( zou, 2005) penalty. But while running the
analysis, I realised tht, I optimised only one lambda. ( even when I
looked at the example in R, they used only one penality) So, I am
2006 Jul 07
6
parametric proportional hazard regression
Dear all,
I am trying to find a suitable R-function for
parametric proportional hazard regressions. The
package survival contains the coxph() function which
performs a Cox regression which leaves the base hazard
unspecified, i.e. it is a semi-parametric method. The
package Design contains the function pphsm() which is
good for parametric proportional hazard regressions
when the underlying base