Displaying 20 results from an estimated 11000 matches similar to: "Time of failure, Arrhenius and Weibull distribution"
2001 Aug 28
2
Estimating Weibull Distribution Parameters - very basic question
Hello,
is there a quick way of estimating Weibull parameters for some data points
that are assumed to be Weibull-distributed?
I guess I'm just too lazy to set up a Maximum-Likelihood estimation...
...but maybe there is a simpler way?
Thanks for any hint (and yes, I've read help(Weibull) ;)
Kaspar Pflugshaupt
--
Kaspar Pflugshaupt
Geobotanical Institute
ETH Zurich, Switzerland
2009 Jun 05
3
Fitting a Weibull Distribution
How do you fit a Weibull distribution in R?
2001 Jul 02
1
nls newbie: help approximating Weibull distribution
Hi folks,
I tried to retain the Weibull distribution using the `nls' function
and proceeding along the lines of the example provided in the
`SSweibull' help (at least I thought so):
t <- (1:200)/100
v <- pweibull(t, shape=3, scale=1)
df <- data.frame(Time=t, Value=v)
Asym <- 1.0; Drop <- 1.0; lrc <- 0; pwr <- 1
df.estimate <- nls(Value ~ SSweibull(Time,
2012 Mar 06
1
Scale parameter in Weibull distribution
Hi all,
I'm trying to generate a Weibull distribution including four covariates in
the model. Here is the code I used:
T = rweibull(200, shape=1.3,
scale=0.004*exp(-(-2.5*b1+2.5*b2+0.9*x1-1.3*x2)/1.3))
C = rweibull(n, shape=1.5, scale=0.008) #censoring time
time = pmin(T,C) #observed time is min of censored and true
event = time==T # set to 1 if event is observed
2006 May 11
2
Maximum likelihood estimate of bivariate vonmises-weibull distribution
Hi,
I'm dealing with wind data and I'd like to model their distribution in
order to simulate data to fill-in missing values. Wind direction are
typically following a vonmises distribution and wind speeds follow a
weibull distribution. I'd like to build a joint distribution of
directions and speeds as a VonMises-Weibull bivariate distribution.
First is this a stupid question? I'm
2009 Jan 04
1
Bivarite Weibull Distribution
HI
Every one
Could some one provide me definitions of following bivariate distributions
gamma, exponencial, Weibull, half-normal , Rayleigh, Erlang,chi-square
thanks
A.S. Qureshi
2009 Nov 25
1
Arrhenius plot with lattice
hello there,
I like to print a theoretical function into my data. It would work with
"panel.curve" when it's all "normal". but unfortunately it's an
arrhenius plot and I need "1000/Temperature"(70-300K) at the x-axis.
With my data it wasn't a Problem but now I have to add this function to
the plot and don't know how to turn around the variable in the
2011 Oct 20
1
R code Error : Hybrid Censored Weibull Distribution
Dear Sir/madam,
I'm getting a problem with a R-code which calculate Fisher Information
Matrix for Hybrid Censored Weibull Distribution. My problem is that:
when I take weibull(scale=1,shape=2) { i.e shape>1} I got my desired
result but when I take weibull(scale=1,shape=0.5) { i.e shape<1} it gives
error : Error in integrate(int2, lower = 0, upper = t) : the integral is
probably
2012 Jan 29
1
r-help; weibull distribution
Please, Help me,
How do I generate data from the weibull distribution if the data contain both failure and interval censored,
For example, I want to generate n=100, shape=2 and scale =4 with 30% interval censored.
What about right censoring
Thank you
[[alternative HTML version deleted]]
2004 Sep 23
2
fitting weibull distribution
Dear all,
I get the following error message. And I cannot quite work out what is
wrong. I think the optim gets infinite values. Certainly my data do not
have any infinite values. How can I solve this?
fitdistr(A1, "weibull")
Error in optim(start, mylogfn, x = x, hessian = TRUE, ...) :
non-finite value supplied by optim
I am using R version 1.9.1 on RedHat Linux, Kernel 2.6.8.
2008 Jun 28
1
How to estimate the parameters in a bivariate weibull distribution?
Hi,Dear all R experts,
As far as I know, fitdistr() is only to estimate the parameters in univariate distributions. I have a set of data (x,y) and I assume it follows a bivariate weibull distribution. Could someone tell me a function in R that is suitable for parameter estimation in multivariate cases? Thanks in advance!
Cheers,
YAN
2009 Nov 26
1
Arrhenius Plot 2 with lattice
Hello,
sorry for incomplete code...
with this I read the file and calculate my stuff. I have a plenty of
them 80-300K every 5 Kelvin. I start with 79K, 80K...300K
test<-read.table("T300_both.txt",header=FALSE,sep="")
RH2<-c(RH2,2.5e7*.32e-4/100e-6/5100*(test$V3[c(2)]-test$V3[c(1)]+test
$V3[c(4)]-test$V3[c(3)]))
n2<-c(n2,-1/(RH2[c(46)]*1.60217e-19))
2006 Oct 25
1
Drawing a reference line for a qqplot with reference to Weibull distribution
Hi,
I'm trying to create a qqplot with reference to a Weibull distribution
including a reference line. This is my current code:
lights.data <- scan("lights.dat")
#Generate Weibull quantiles
prob.grid <- ppoints(length(lights.data))
prob.quant <- qweibull(prob.grid , 1.5,4)
#Draw QQ plot
qqplot(prob.quant,lights.data)
#add red reference line
qqline(lights.data,col = 2)
2006 Apr 26
1
cdf of weibull distribution
Hi,
I have a data set which is assumed to follow weibull distr'. How can I find of cdf for this data. For example, for normal data I used (package - lmomco)
>cdfnor(15,parnor(lmom.ub(c(df$V1))))
Also, lmomco package does not have functions for finding cdf for some of the distributions like lognormal. Is there any other package, which can handle these distributions?
2008 Jun 27
1
adtest for weibull distribution
HiI need help about anderson-darlin test for a weibull distribution in R.Thanks.
René
_________________________________________________________________
[[elided Hotmail spam]]
e ready.
[[alternative HTML version deleted]]
2009 Mar 22
1
Estimating LC50 from a Weibull distribution
I am attempting to estimate LC50 (analogous to LD50, but uses exposure
concentration rather than dose) by fitting a Weibull model; but I
can't seem to get it to work. From what I can gather, I should be
using survreg() from the survival package. The survreg() function
relies on time-to-event data; my data result from 96 h exposures
(i.e., dead or alive after a fixed period; 96 h). I've
2014 Mar 04
1
[GSoC student proposal] Implementation of Modified Weibull-G Family Distribution in R
Dear Brian and R team,
I am Dr. Aleem and I want to participate as a student in GSoC 2014 in the
development of R. I have extensive experience in Statistical research and
development and I am a student of advanced statistics applications. I
strongly believe that the inclusion of Modified Weibull-G Family
Distribution in R will significanlty help the reseasrch community in doing
2012 Mar 05
1
Fitting & evaluating mixture of two Weibull distributions
Hello,
I would like to fit a mixture of two Weibull distributions to my data, estimate the model parameters, and compare the fit of the model to that of a single Weibull distribution.
I have used the mix() function in the 'mixdist' package to fit the mixed distribution, and have got the parameter estimates, however, I have not been able to get the log-likelihood for the fit of this model
2008 Oct 07
3
Fitting weibull, exponential and lognormal distributions to left-truncated data.
Dear All,
I have two questions regarding distribution fitting.
I have several datasets, all left-truncated at x=1, that I am attempting
to fit distributions to (lognormal, weibull and exponential). I had
been using fitdistr in the MASS package as follows:
fitdistr<-(x,"weibull")
However, this does not take into consideration the truncation at x=1. I
read another posting in this
2013 Nov 03
1
Comparison of two weibull distributions
Hello,
How can I do a test of two weibull distributions?
I have two weibull distribution sets from two wind datasets in order to
check whether they are same.
I thought 2 sample t-test would be applicable but I couldn't find any ways
to do that on the Internet.
Does anyone know what type of test is applicable to my purpose? and what R
function can you recommend?
Plus, if it turned out that