similar to: (no subject)

Displaying 20 results from an estimated 900 matches similar to: "(no subject)"

2009 Jul 02
1
diagram package treearrow help
Hi, I would like to write text on top of an arrow.How can I do this? -- Rajesh.J [[alternative HTML version deleted]]
2010 Jan 20
2
Error meaning
Hi r-users,   I have the following code to solve 4 simultaneous eqns with 4 unknowns using newton iteration method.  But I got the error message:   pars <- c(1.15, 40, 50, 0.78) newton.input2 <- function(pars) {  ## parameters to estimate      alp <- pars[1]    b1  <- pars[2]     b2  <- pars[3]    rho <- pars[4]   f1 <- pars[1]*pars[2] f2 <-
2017 Feb 09
3
Ancient C /Fortran code linpack error
> > On 9 Feb 2017, at 16:00, G?ran Brostr?m <goran.brostrom at umu.se> wrote: > > > > In my package 'glmmML' I'm using old C code and linpack in the optimizing procedure. Specifically, one part of the code looks like this: > > > > F77_CALL(dpoco)(*hessian, &bdim, &bdim, &rcond, work, info); > > if (*info == 0){ > >
2010 Apr 06
1
estimating the starting value within a ODE using nls and lsoda
All- I am interested in estimating a parameter that is the starting value for an ODE model. That is, in the typical combined fitting procedure using nls and lsoda (alternatively rk4), I first defined the ODE model: minmod <- function(t, y, parms) { G <- y[1] X <- y[2] with(as.list(parms),{ I_t <- approx(time, I.input, t)$y dG <- -1*(p1 + X)*G +p1*G_b dX <-
2017 Jun 21
0
customizing color key with plot3D
Karline, Thank you for your help. I discovered that in addition to including clim, I needed to omit breaks. This code uses one of your other examples as a starting point and works as intended: persp3D(z = volcano, zlim = c(-60, 200), phi = 20, colkey = list(length = 0.2, width = 0.4, shift = 0.15, cex.axis = 0.8, cex.clab = 0.85), lighting = TRUE, lphi = 90, clab =
2017 Feb 10
1
Ancient C /Fortran code linpack error
> On 10 Feb 2017, at 14:53, G?ran Brostr?m <goran.brostrom at umu.se> wrote: > > Thanks to all who answered my third question. I learned something, but: > > On 2017-02-09 17:44, Martin Maechler wrote: >> >>>> On 9 Feb 2017, at 16:00, G?ran Brostr?m <goran.brostrom at umu.se> wrote: >>>> >>>> In my package 'glmmML'
2011 Mar 15
1
Problem with nls.lm function of minpack.lm package.
Dear R useRs, I have a problem with nls.lm function of minpackl.lm package. I need to fit the Van Genuchten Model to a set of data of Theta and hydraulic conductivity with nls.lm function of minpack.lm package. For the first fit, the parameter estimates keep changing even after 1000 iterations (Th) and I have a following error message for fit of hydraulic conductivity (k); Reason for
2009 Jun 22
1
The gradient of a multivariate normal density with respect to its parameters
Does anybody know of a function that implements the derivative (gradient) of the multivariate normal density with respect to the *parameters*? It?s easy enough to implement myself, but I?d like to avoid reinventing the wheel (with some bugs) if possible. Here?s a simple example of the result I?d like, using numerical differentiation: library(mvtnorm) library(numDeriv) f=function(pars, xx, yy)
2009 Nov 20
2
Problem with Numerical derivatives (numDeriv) and mvtnorm
I'm trying to obtain numerical derivative of a probability computed with mvtnorm with respect to its parameters using grad() and jacobian() from NumDeriv. To simplify the matter, here is an example: PP1 <- function(p){ thetac <- p thetae <- 0.323340333 thetab <- -0.280970036 thetao <- 0.770768082 ssigma <- diag(4) ssigma[1,2] <- 0.229502120
2013 Apr 10
0
Problem with ode
Hi, I am trying to run a 1D nutrient-phytoplankton-zooplankton model in R using the package 'deSolve'. The code is shown below: DEPTH = seq(2.5, 147.5, 5) NPZ = function(t, state, params){ with(as.list(params), { P <- state[1:NB] Z <- state[(NB + 1): (2*NB)] N <- state[(2*NB + 1): (3*NB)] F.I = function(z, hr){ I0 = function(hr){
2003 Oct 17
2
nlm, hessian, and derivatives in obj function?
I've been working on a new package and I have a few questions regarding the behaviour of the nlm function. I've been (for better or worse) using the nlm function to fit a linear model without suppling the hessian or gradient attributes in the objective function. I'm curious as to why the nlm requires 31 iterations (for the linear model), and then it doesn't work when I try to add
2009 Apr 07
2
Maple and R
Hi R-users, Can Maple function be exported to R? I have a jacobian matrix (4X4)?from maple in algebraic form which involve modified Bessel function of the first kind. I just wonder whether we can use algebraic form into R before the value of the parameters can be estimated. Thank you so much for your attention and help.
2008 Dec 24
3
statistical significance, nonlinear regression
I am using nonlinear regression to fit a couple of variables to a set of measurements. I would like to do some significance tests for the estimated parameters. I am able to check the confidence intervals using the Jacobian coming out of nonlinear regression. I do see in a paper which shows t-value (it says estimated by White method??), f-value, f-test, and j-test, are these available in matlab,
2011 Apr 28
1
DLSODA error
Dear R-users, I'm running an MLE procedure where some ODEs are solved for each iteration in the maximization process. I use mle2 for the Maximum likelihood and deSolve for the ODEs. The problem is that somewhere along the way the ODE solver crashes and I get the following error message: DLSODA- Warning..Internal T (=R1) and H (=R2) are such that in the machine, T + H = T on the next
2007 Jul 10
2
integration over a simplex
Hello The excellent adapt package integrates over multi-dimensional hypercubes. I want to integrate over a multidimensional simplex. Has anyone implemented such a thing in R? I can transform an n-simplex to a hyperrectangle but the Jacobian is a rapidly-varying (and very lopsided) function and this is making adapt() slow. [ A \dfn{simplex} is an n-dimensional analogue of a triangle or
2003 Feb 25
1
Error analysis
Dear R experts, I fitted data (length == m) with an external library (that's a non-linear problem), and, I've got the final parameter vector (length == n) and Jacobian matrix (dim == c(m, n)). Now, I want to analyse the standard errors of the parameters correctly. How can I do it? Where can I read about it else? Thanks! -- WBR, Timur.
2013 Jan 31
1
Please, problem using “bcPower”
Hello, I would like to perform a Box-Cox (“bcPower”) transformation on my data. For this, I am determining lambda using the “powerTransform” function. However, with one of my variables I get the following Warning Message: In estimateTransform(x, y, NULL, ...) : Convergence failure: return code = 52 My variable is: > x [1] 0.0001031130 0.0001029480 0.0001040010 0.0001037940 0.0001046280
2005 Jan 12
4
"model.response" error
When I installed R 2.0.1 (replacing 1.9.0) for Windows, a code using "model.response" began acting up. Here are the first several lines of a code I had been tweaking for a spatial model (the code is mostly that of Roger Bivand--I am adapting it to a slightly different data structure and the problem I'm sure is with my changes, not his code). <command name> <- function
2008 Apr 29
1
NumDeriv - derivatives of covariance matrix
Hello R-help, I need to compute matrices of first derivatives of a covariance matrix C with entries given by c_ij=theta*exp(-0.5* sum(eta*(x[i,]-x[j,])^2)), wrt to elements of eta, a m-dimensional vector of parameters, given a n*m data matrix x. So far, I have been computing matrices for each parameter (given by par[index]) analytically, using the following kmatder<- function(x, par, index) {
2009 Oct 29
4
deriv() to take vector of expressions as 1st arg?
The deriv() function takes an 'expression' as its first argument). I was wondering if the this function can take an array or a vector of expressions as its first argument. Aside, I saw how to give a vector argument to the second argument. like to have something like: deriv(c(~x^2+y^3, ~x^5+y^6), c("x","y")) the documentation for this function talks about being able to