similar to: Non-linear regression/Quantile regression

Displaying 20 results from an estimated 500 matches similar to: "Non-linear regression/Quantile regression"

2004 Feb 04
1
Fitting nonlinear (quantile) models to linear data.
Hello. I am trying to fit an asymptotic relationship (nonlinear) to some ecological data, and am having problems. I am interested in the upper bound on the data (i.e. if there is an upper limit to 'y' across a range of 'x'). As such, I am using the nonlinear quantile regression package (nlrq) to fit a michaelis mention type model. The errors I get (which are dependant on
2006 Dec 02
2
nonlinear quantile regression
Hello, I?m with a problem in using nonlinear quantile regression, the function nlrq. I want to do a quantile regression o nonlinear function in the form a*log(x)-b, the coefficients ?a? and ?b? is my objective. I try to use the command: funx <- function(x,a,b){ res <- a*log(x)-b res } Dat.nlrq <- nlrq(y ~ funx(x, a, b), data=Dat, tau=0.25, trace=TRUE) But a can?t solve de problem,
2012 Feb 13
1
non linear quantile regression - Median not plotting where it should
Hi, I'm attempting to calculate the 0.25 and 0.97 quantiles for tree height (0-50 meters) against tree age (0-300 years) and I am running into some difficulty with the plotted grafic. I've run the examples in the quantreg help and can get those to work properly and by plugging in my data I can also get the lines plotted on my dataset. Unfortunately I'm running into a problem with the
2008 Jan 16
1
nlrq coefficients querry
I have been quantreg library for a number of projects but have just hit a snag. I am using nlrq to examine an asymptotic relationship between 2 variables at the 99th percentile. It performs as expected, however when I try to extract the coefficients along with se and significance I am running into problems. The problem is that for the nlrq regression Dat.nlrq, summary(Dat.nlrq) reports a different
2008 Jan 01
2
Non-Linear Quantile Regression
Please, I have a problem with nonlinear quantile regression. My data shows a large variability and the quantile regression seemed perfect to relate two given variables. I got to run the linear quantile regression analysis and to build the graph in the R (with quantreg package). However, the up part of my data dispersion seems a positive exponential curve, while the down part seems a negative
2008 Aug 18
1
"nested" getInitial calls; variable scoping problems
Hi All, Another nls related problem (for background, I'm migrating a complicated modelling package from S-plus to R). Below I've reduced this to the minimum necessary to demonstrate my problem (I think); the real situation is more complicated. Two similar selfStart functions, ssA and ssB. The 'initial' function for ssB modifies its arguments a little and then calls getInital
2004 May 06
1
sporadic errors with nlrq() / optim()
Dear List, Apologies if this is a known problem ... I wasn't able to find it on the bug list, but it is a problem that does not seem to occur with a MAC build of R 2.0, so perhaps this problem has already been addressed for the future. I am getting *sporadic* errors when refitting the same model to the same data set, using nlrq() in the nlrq package. The algorithm is not stochastic, so I
2005 Oct 26
1
help with a self-starting function in nonlinear least squares regression.
Hello. I am having a problem setting up a self-starting function for use in nonlinear regression (and eventually in the mixed model version). The function is a non-rectangular hyperbola - called "NRhyperbola" - which is used for fitting leaf photosynthetic rate to light intensity. It has one independent variable (Irr) and four parameters (theta, Am, alpha and Rd). I have created this
2011 Oct 16
1
nlrq {quantreg}
Dear all, I sent an email on Friday asking about nlrq {quantreg}, but I haven't received any answer. I need to estimate the quantile regression estimators of a model as: y = exp(b0+x'b1+u). The model is nonlinear in parameters, although I can linearise it by using log.When I write: fitnl <- nlrq(y ~ exp(x), tau=0.5) I have the following error: Error in match.call(func, call = cll) :
2011 Jun 17
2
Non-linear Regression best-fit line
I am trying to fit a curve to a cumulative mortality curve (logistic) where y is the cumulative proportion of mortalities, and t is the time in hours (see below). Asym. at 0 and 1 > y [1] 0.00000000 0.04853859 0.08303777 0.15201970 0.40995074 0.46444992 0.62862069 0.95885057 1.00000000 [10] 1.00000000 1.00000000 > t [1] 0 13 20 24 37 42 48 61 72 86 90 I tried to find starting values for
2009 Oct 17
1
custom selfStart model works with getInitial but not nls
Hello, I'm having problems creating and using a selfStart model with nlme. Briefly, I've defined the model, a selfStart object, and then combined them to make a selfStart.default model. If I apply getInitial to the selfStart model, I get results. However, if I try usint it with nls or nlsList, these routines complain about a lack of initial conditions. If someone could point out
2010 Mar 30
1
nlrq parameter bounds
Hi there, Can anyone please tell me if it is possible to limit parameters in nlrq() to 'upper' and 'lower' bounds as per nls()? If so how?? Many thanks in advance
2008 Aug 11
1
variance covariance matrix of parameter estimate using nlrq
In "lm" command, we can use "vcov" option to get variance-covariance matrix. Does anyone know how to get variance-covariance matrix in nlrq? Thanks, Kate [[alternative HTML version deleted]]
2003 Nov 20
3
nls, nlrq, and box-cox transformation
Dear r-help members I posted this message already yesterday, but don't know whether it reached you since I joined the group only yesterday. I would like to estimate the boxcox transformed model (y^t - 1)/t ~ b0 + b1 * x. Unfortunately, R returns with an error message when I try to perform this with the call nls( I((y^t - 1)/t) ~ I(b0 + b1*x), start = c(t=1,b0=0,b1=0), data = mydataframe)
2002 May 02
2
a question
Hi, I have a program written in R which is good on the version 1.2, but for the fallowing versions of R, an error always is at the same place. That is at the level of the fallowing line: Sur<- getInitial(res2[m:M,2]~SSasymp(res2[m:M,1],Asymp,resp0,lrc),data=res2) Error in eval(expr,envir,enclos):numeric envir arg not of length one I don't know at all this langage for the instant.
2005 Sep 01
1
making self-starting function for nls
Hello. Following pages 342-347 of Pinheiro & Bates, I am trying to write a self-starting nonlinear function (a non-rectagular hyperbola) to be used in nonlinear least squares regression (and eventually for a mixed model). When I use the getInitial function for my self-starting function I get the following error message: > getInitial(photo~NRhyperbola(Irr,theta,Am,alpha,Rd),dat) Error
2005 Apr 23
1
start values for nls() that don't yield singular gradients?
I'm trying to fit a Gompertz sigmoid as follows: x <- c(15, 16, 17, 18, 19) # arbitrary example data here; y <- c(0.1, 1.8, 2.2, 2.6, 2.9) # actual data is similar gm <- nls(y ~ a+b*exp(-exp(-c*(x-d))), start=c(a=?, b=?, c=?, d=?)) I have been unable to properly set the starting value '?'s. All of my guesses yield either a "singular gradient" error if they
2009 Oct 22
1
Automatization of non-linear regression
Hi everybody, I'm using the method described here to make a linear regression: http://www.apsnet.org/education/advancedplantpath/topics/Rmodules/Doc1/05_Nonlinear_regression.html > ## Input the data that include the variables time, plant ID, and severity > time <- c(seq(0,10),seq(0,10),seq(0,10)) > plant <- c(rep(1,11),rep(2,11),rep(3,11)) > > ## Severity
2008 Sep 18
0
quantile regression / problems calling nlrq from inside other functions
All, This worked: mBW <- function( ... ) ... # matrix-valued function BaconWatts <- function(formula, mmf=mBW, # model matrix function(x, bp, g) data, plot=T, tau=0.5 ) { ... m.nl <- nlrq(y ~ b0 + mBW(x,bp,g) %*% c(b1,b2), tau=tau, start=par0, trace=T )$m ... } For some reason the following reports a failure to find the
2006 Jun 07
4
R crashes on quantreg
I was trying "quantreg" package, lm1 <- lm(y~x) rq1 <- rq(y~x) plot(summary(rq1)) #then got a warning says singular value, etc. but this line can be omited plot(lm1) #crash here It happened every time on my PC, Windows XP Pro Serv. Pack 1, Pentium(4) 3.00G. [[alternative HTML version deleted]]