search for: dpareto

Displaying 9 results from an estimated 9 matches for "dpareto".

Did you mean: pareto
2003 Aug 28
2
ks.test()
...da,b) pexp(x-b,rate=lambda) qexpt<-function(p,lambda,b) qexp(p,rate=lambda)+b rexpt<-function(n,lambda,b) rexp(n,rate=lambda)+b #PARETO paretofit<-function(x,b, plot.it = F, lty = 1){ x <- sort(x) alpha <- length(x)/sum(log(x/b)) if(plot.it) { lines(x, dpareto(x, alpha = alpha, b = b), lty = lty,col="red")} result <- list(alpha = alpha, b = b) class(result) <- "pareto" result} dpareto<-function(x, alpha,b) ifelse(x<b,0,alpha*(b^alpha)/(x^(alpha+1))) ppareto<-function(x, alpha,b) ifelse(x&...
2005 Jan 09
2
How can I simulate Pareto distribution in R?
Hi, guys, I need to simulate Pareto distribution. But I found 'rpareto' didn't exist in R. And it seems that Pareto distribution don't have mathematical relationships with other distributions. What can I do? Thanks a lot. Ni --------------------------------- [[alternative HTML version deleted]]
2008 Aug 25
1
(no subject)
I am very new user of R project. Sir I am a research scholar. I am doing work on fitting distributions. Actually sir I want to know that what package is use to find parameters of pareto distribution by maximum likelihood method. and i want to find these parameters from my calculated data. Sir I am waiting for your positive response. Thanks
2009 Jan 10
0
Fitting pareto to some data
...t i've one problem. Using optim to calculate the maximum of the likelihood function of the pareto I use as start parameters the moments method(using the distribution function in the package actuar): media=mean(x) var=mean(x^2)-media^2 scale=2*var/(var-media^2) shape=(scale-1)*media fitdistr(x,dpareto,list(shape=shape,scale=scale)) The problem is how to initialize the shape and scale parameters when "var<=media^2" . When "var<=media^2" scale and shape parameters are negative using moments method. Does anyone know how to initialize the paramaters when "var<=medi...
2020 Oct 24
0
Fitting Mixed Distributions in the fitdistrplus package
...al) is among the best distributions for the Danish dataset. You may also consider composite distributions, see https://CRAN.R-project.org/view=Distributions Kind regards, Christophe dmixgam <- function(x, prob, shape1, scale1, shape2, scale2) prob*dgamma(x, shape1, scale=scale1)+ (1-prob)*dpareto(x, shape2, scale=scale2) pmixgam <- function(q, prob, shape1, scale1, shape2, scale2) prob*pgamma(q, shape1, scale=scale1)+ (1-prob)*ppareto(q, shape2, scale=scale2) library(actuar) library(fitdistrplus) data("danishuni") x<- danishuni$Loss fgam<- fitdist(x,"gamma",...
2010 Jan 04
3
how to plot multiple density functions in one graph
Hello, I am new to R and have two easy questions. How can you plot multiple density functions in one graph? I have five beta densities that I would like to plot in one graph. I understand how to plot one beta density as a line: plot (x,(dbeta(x,shape1=,shape2=,), type ="l") Does the Pareto distribution need to be added to R with an additional package? thanks, John [[alternative
2008 Nov 14
0
Error in optim when i call it from a function
...supplied as a function or name") n <- length(x) if (is.character(densfun)) { distname <- tolower(densfun) densfun <- switch(distname,exponential = dexp,gamma = dgamma, "log-normal" = dlnorm, lognormal = dlnorm, weibull = dweibull, pareto = dpareto, NULL) distfun <- switch(distname,exponential = pexp,gamma = pgamma, "log-normal" = plnorm, lognormal = plnorm, weibull = pweibull, pareto = ppareto, NULL) if (is.null(densfun)) stop("unsupported distribution")...
2010 Jan 12
1
Strange behavior when trying to piggyback off of "fitdistr"
...uot;) n <- length(x) if (is.character(distfun)) { distname <- tolower(distfun) densfun <- switch(distname, exp = dexp, exponential = dexp, gamma = dgamma, `log-normal` = dlnorm, lnorm = dlnorm, lognormal = dlnorm, weibull = dweibull, pareto = dpareto, loglogistic = dllogis, transbeta = dtrbeta, `transformed beta` = dtrbera, burr = dburr, paralogistic = dparalogis, genpareto = dgenpareto, generalizedpareto = dgenpareto, `generalized pareto` = dgenpareto, invburr = dinvburr, `inverse burr` = dinvbu...
2009 Jan 15
2
Interface to open source Reporting tools
...ulate the maximum of the likelihood function of the > pareto I use as start parameters the moments method(using the distribution > function in the package actuar): > > media=mean(x) > var=mean(x^2)-media^2 > scale=2*var/(var-media^2) > shape=(scale-1)*media > > fitdistr(x,dpareto,list(shape=shape,scale=scale)) > > The problem is how to initialize the shape and scale parameters when > "var<=media^2" . When "var<=media^2" scale and shape parameters are > negative > using moments method. > Does anyone know how to initialize the param...