similar to: Non-Linear Quantile Regression

Displaying 20 results from an estimated 8000 matches similar to: "Non-Linear Quantile Regression"

2009 Jun 09
1
Non-linear regression/Quantile regression
Hi, I'm relatively new to R and need to do a quantile regression. Linear quantile regression works, but for my data I need some quadratic function. So I guess, I have to use a nonlinear quantile regression. I tried the example on the help page for nlrq with my data and it worked. But the example there was with a SSlogis model. Trying to write dat.nlrq <- nlrq(BM ~ I(Regen100^2),
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
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
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) :
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
2011 Jul 11
3
quantile regression: out of memory error
Hello, I?m wondering if anyone can offer advice on the out-of-memory error I?m getting. I?m using R2.12.2 on Windows XP, Platform: i386-pc-mingw32/i386 (32-bit). I am using the quantreg package, trying to perform a quantile regression on a dataframe that has 11,254 rows and 5 columns. > object.size(subsetAudit.dat) 450832 bytes > str(subsetAudit.dat) 'data.frame': 11253 obs.
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
2011 Aug 23
3
Change Variable Labels in Quantile Plot
I have spent hours on this ---looked through the quantreg manual and r-help site--- still couldn't figure out the answer. Can someone please help me on this? I plot the result from quantile regression and want to change the variable labels: temp<-rq(dep~inc+age50, data=newdata, tau=1:9/10) temp2<-plot(summary(temp)) dimnames(temp2)[[1]]<-c("Intercept", "Per Capita
2012 Oct 30
6
standard error for quantile
Dear all I have a question about quantiles standard error, partly practical partly theoretical. I know that x<-rlnorm(100000, log(200), log(2)) quantile(x, c(.10,.5,.99)) computes quantiles but I would like to know if there is any function to find standard error (or any dispersion measure) of these estimated values. And here is a theoretical one. I feel that when I compute median from given
2009 May 31
1
warning message when running quantile regression
Hi All, I am running quantile regression in a "for loop" starting with 1 variable and adding a variable at a time reaching a maximum of 20 variables. I get the following warning messages after my "for" loop runs. Should I be concerned about these messages? I am building predictive models and am not interested in inference. Warning messages: 1: In
2012 Jun 07
1
Quantile regression: Discrepencies Between optimizer and rq()
Hello Everyone, I'm currently learning about quantile regressions. I've been using an optimizer to compare with the rq() command for quantile regression. When I run the code, the results show that my coefficients are consistent with rq(), but the intercept term can vary by a lot. I don't think my optimizer code is wrong and suspects it has something to do with the starting
2009 Feb 17
6
Percentiles/Quantiles with Weighting
Hi All, I am looking at applications of percentiles to time sequenced data. I had just been using the quantile function to get percentiles over various periods, but am more interested in if there is an accepted (and/or R-implemented) method to apply weighting to the data so as to weigh recent data more heavily. I wrote the following function, but it seems quite inefficient, and not really very
2004 Jun 15
1
fit.mult.impute and quantile regression
I have a largish dataset (1025) with around .15 of the data missing at random overall, but more like .25 in the dependent variable. I am interested in modelling the data using quantile regression, but do not know how to do this with multiply imputed data (which is what the dataset seems to need). The original plan was to use qr (or whatever) from the quantreg package as the 'fitter'
2011 Nov 05
2
linear against nonlinear alternatives - quantile regression
Dear all, I would like to know whether any specification test for linear against nonlinear model hypothesis has been implemented in R using the quantreg package. I could read papers concerning this issue, but they haven't been implemented at R. As far as I know, we only have two specification tests in this line: anova.rq and Khmaladze.test. The first one test equality and significance of
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)
2011 Nov 19
1
wald test: compare quantile regression estimators from different samples
Dear all, I am trying to compare the estimated coefficients of a quantile regression model between two different samples. It is a Wald test, but I cannot find one way to do that in R.The samples are collected conditional on a specific characteristic and I would like to test whether such characteristic indeed affect the estimators. The problem in the test anova.rq is that the response variable
2012 Jul 28
4
quantreg Wald-Test
Dear all, I know that my question is somewhat special but I tried several times to solve the problems on my own but I am unfortunately not able to compute the following test statistic using the quantreg package. Well, here we go, I appreciate every little comment or help as I really do not know how to tell R what I want it to do^^ My situation is as follows: I have a data set containing a
2003 Sep 01
0
Quantile Regression Packages
I'd like to mention that there is a new quantile regression package "nprq" on CRAN for additive nonparametric quantile regression estimation. Models are structured similarly to the gss package of Gu and the mgcv package of Wood. Formulae like y ~ qss(z1) + qss(z2) + X are interpreted as a partially linear model in the covariates of X, with nonparametric components defined as
2011 Jan 11
1
Confidence interval on quantile regression predictions
I am using the quantreg package to build a quantile regression model and wish to generate confidence intervals for the fitted values. After fitting the model, I have tried running predict() and predict.rq(), but in each case I obtain a vector of the fitted values only. For example: library(quantreg) y<-rnorm(50,10,2) x<-seq(1,50,1)