options(warn = -1)
library(readxl)
source('functions.R')
## Loading required package: survival
Sys.setlocale(category = "LC_ALL", locale = "Hebrew")
## [1] "LC_COLLATE=Hebrew_Israel.1255;LC_CTYPE=Hebrew_Israel.1255;LC_MONETARY=Hebrew_Israel.1255;LC_NUMERIC=C;LC_TIME=Hebrew_Israel.1255"
a18 <- read.csv("~/1R/Otzma/Otzma 2018 results.csv", stringsAsFactors=FALSE)
a17 <- read.csv("~/1R/Otzma/Otzma 2017 results.csv", stringsAsFactors=FALSE)
a18$call_date=as.Date.character(a18$call_date,"%d-%m-%y") # only for 2018
a18$start_date=as.Date.character(a18$start_date,"%d-%m-%y") # only for 2018
a18$finish_date=as.Date.character(a18$finish_date,"%d-%m-%y") # only for 2018
#a17$call_date=as.Date.character(a17$call_date) # only for 2017 option 2
#a17$start_date=as.Date.character(a17$start_date) # only for 2017 option 2
#a17$finish_date=as.Date.character(a17$finish_date,"%d/%m/%y") # only for 2017 option 2
a17$call_date=as.Date.character(a17$call_date,"%d-%m-%y") # only for 2017
a17$start_date=as.Date.character(a17$start_date,"%d-%m-%y") # only for 2017
a17$finish_date=as.Date.character(a17$finish_date,"%d-%m-%y") # only for 2017
au0 <- a17[,c(3,5:19)] # for 2017
au0 = rbind(au0,a18[,c(3,5:19)]) # add 2018
au1=au0[au0$machine!="eagle" & au0$machine!="matrix" & au0$machine!="auto",]
au1=au1[order(au1$start_date),]
au1=au1[!is.na(au1$responsibility),]
au1$responsibility=as.factor(au1$responsibility)
fn="dt other results 2017&2018 17-17-2018.txt"
origin=as.numeric(as.Date.character(c("2010-01-01")))
f=file(description = fn, open = "wt", encoding = "UTF-8")
o.ix=1
all_machines=as.factor(au1$machine)
all_machines=names(summary(all_machines))
for (x in all_machines) {
m1=au1[au1$machine==x,]
m1=data.frame(m1,dt=rep(0,length(m1[[1]])), ttr=rep(0,length(m1[[1]])))
sum1=summary(m1$responsibility)
for (i in 1:length(sum1)) {
t1=names(sum1[i])
m_=m1[m1$responsibility==t1,]
n=length(m_$machine)
if (n<3) next
m = build_dt1(m_)
t<-"delta-T Fit "
t=paste(t,m$machine[1],m$machine_ix[1],t1)
print(t)
write(t, f)
write(paste("TTFF,",(as.numeric(m$dt[1])-origin[o.ix])),f)
m$dt[1]=1
#m=m[2:length(m[[1]]),]
n=length(m$machine)
e=NULL
if (n>3) {
e=compare_discrete(m,paste("Discrete",t))
}
if (n>2) {
e=rbind(e,compare_conti(m,paste("Continuous",t)) )
#e=compare_conti(m,paste("Continuous",t))
}
if (!is.null(e)) write.csv(e[order(e[,1], e[,2]),], f)
if (n>3) {
e=fit_dt(m,t)
write(paste("MEAN,",e$mean),f)
write(paste("SD,",e$sd),f)
write(paste("SKEWNESS,",e$skewness),f)
write(paste("KUROSIS,",e$kurtosis),f)
}
}
}
## [1] "delta-T Fit bullmer 0 בקרות"
## [1] "Discrete delta-T Fit bullmer 0 בקרות"
## [1] "P-L GoF: 0.183132204259545"
## [1] "P-L xmin: 19"
## [1] "P-L pars: 2.29"

## [1] "L-N GoF: 0.154052645516949"
## [1] "L-n xmin: 19"
## [1] "L-N pars: 2.12737993242189" "L-N pars: 1.27583602192973"
## [1] "LogNormal fit: 2.84217228738264 - -41.346732112407"
## [2] "LogNormal fit: 1.39510617743801 - -41.346732112407"
## [1] "Exponential fit: 0.0286624203821656 - -40.9695156771483"
## [1] "Poisson GoF: 0.497889457542779"
## [1] "Poisson xmin: 5"
## [1] "Poisson pars: 39.1249998076092"
## [1] "Exp GoF: 0.143727484608163"
## [1] "Exp xmin: 6"
## [1] "Exp pars: 0.0259762660016216"
## [1] "Continuous delta-T Fit bullmer 0 בקרות"
## [1] "P-L GoF: 0.169710301935643"
## [1] "P-L xmin: 33"
## [1] "P-L pars: 2.85"

## [1] "L-N GoF: 0.104213399884732"
## [1] "L-n xmin: 19"
## [1] "L-N pars: 3.5292257439725" "L-N pars: 0.799141784235516"
## [1] "Weibull GoF: 0.0996880941477861"
## [1] "Weibull xmin: 5"
## [1] "Weibull pars: 1.0000747733923" "Weibull pars: 39.0021631042939"
## [1] "Exp GoF: 0.0896175097660212"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.03"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 129
## median: 22
## mean: 34.88889
## estimated sd: 39.79147
## estimated skewness: 1.906976
## estimated kurtosis: 7.141832
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.8874545 0.2333627
## scale 32.9167536 13.0300112
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.842172 0.4650354
## sdlog 1.395106 0.3288289
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.02866242 0.009542494

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.13523637 0.19588451 0.17533396
## Cramer-von Mises statistic 0.02279556 0.04501656 0.02976266
## Anderson-Darling statistic 0.16380209 0.27743067 0.25099687
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 85.72022 86.69346 83.93903
## Bayesian Information Criterion 86.11467 87.08791 84.13626
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.5178191 0.3926742 0.6792240
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1352364 0.1958845 0.1753340
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 85.72022 86.69346 83.93903
## [1] "delta-T Fit bullmer 0 חשמל"
## [1] "Discrete delta-T Fit bullmer 0 חשמל"
## [1] "P-L GoF: 0.105157274528565"
## [1] "P-L xmin: 10"
## [1] "P-L pars: 2.02"

## [1] "L-N GoF: 0.0809644677750795"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.35758297399189" "L-N pars: 1.39283041207397"
## [1] "LogNormal fit: 2.41282056696642 - -86.3552579883803"
## [2] "LogNormal fit: 1.32365393126994 - -86.3552579883803"
## [1] "Exponential fit: 0.0430327868852459 - -87.0616523307242"
## [1] "Poisson GoF: 0.313251307962669"
## [1] "Poisson xmin: 72"
## [1] "Poisson pars: 84.220760835908"
## [1] "Exp GoF: 0.140165256480539"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.0439937267298551"
## [1] "Continuous delta-T Fit bullmer 0 חשמל"
## [1] "P-L GoF: 0.115285009249324"
## [1] "P-L xmin: 10"
## [1] "P-L pars: 2.08"

## [1] "L-N GoF: 0.0850235798670534"
## [1] "L-n xmin: 4"
## [1] "L-N pars: 2.6007165154655" "L-N pars: 1.13569661005073"
## [1] "Weibull GoF: 0.0851862630408632"
## [1] "Weibull xmin: 4"
## [1] "Weibull pars: 0.667088684386285" "Weibull pars: 14.3407612823045"
## [1] "Exp GoF: 0.114132503202903"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.05"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 97
## median: 11
## mean: 23.2381
## estimated sd: 28.55154
## estimated skewness: 1.741109
## estimated kurtosis: 5.022848
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.8509866 0.1417521
## scale 21.2366969 5.7613158
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.412821 0.2888450
## sdlog 1.323654 0.2042437
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.04303279 0.00938545

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.10381218 0.10869397 0.1478257
## Cramer-von Mises statistic 0.04938272 0.03372733 0.1217695
## Anderson-Darling statistic 0.35971746 0.34454230 0.7765824
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 177.1029 176.7105 176.1233
## Bayesian Information Criterion 179.1919 178.7996 177.1678
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.4730375 0.7882798 0.5954436
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1038122 0.1086940 0.1478257
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 177.1029 176.7105 176.1233
## [1] "delta-T Fit bullmer 0 מכונות"
## [1] "Discrete delta-T Fit bullmer 0 מכונות"
## [1] "P-L GoF: 0.289756721174769"
## [1] "P-L xmin: 7"
## [1] "P-L pars: 1.59"

## [1] "L-N GoF: 0.19393118182322"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.19914517101495" "L-N pars: 2.13841299332915"
## [1] "LogNormal fit: 2.59966461225709 - -50.5803708601038"
## [2] "LogNormal fit: 1.78534627367999 - -50.5803708601038"
## [1] "Exponential fit: 0.0253456221198157 - -51.4266418743224"
## [1] "Poisson GoF: 0.499997893862239"
## [1] "Poisson xmin: 43"
## [1] "Poisson pars: 86.7499956216841"
## [1] "Exp GoF: 0.170582403837258"
## [1] "Exp xmin: 7"
## [1] "Exp pars: 0.0211247524987498"
## [1] "Continuous delta-T Fit bullmer 0 מכונות"
## [1] "P-L GoF: 0.211580932416878"
## [1] "P-L xmin: 42"
## [1] "P-L pars: 3.19"

## [1] "L-N GoF: 0.0972771680580844"
## [1] "L-n xmin: 7"
## [1] "L-N pars: 3.78478502825956" "L-N pars: 0.796866671670666"
## [1] "Weibull GoF: 0.127118497043248"
## [1] "Weibull xmin: 7"
## [1] "Weibull pars: 1.14491674910174" "Weibull pars: 58.6074239412067"
## [1] "Exp GoF: 0.128414696208591"
## [1] "Exp xmin: 7"
## [1] "Exp pars: 0.02"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 167
## median: 21
## mean: 39.45455
## estimated sd: 50.37532
## estimated skewness: 1.890142
## estimated kurtosis: 6.78693
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.6935081 0.1686345
## scale 31.4261635 14.3955372
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.599665 0.5383022
## sdlog 1.785346 0.3806366
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.02534562 0.007630075

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.18525106 0.20004648 0.2477002
## Cramer-von Mises statistic 0.04901469 0.08413206 0.1177448
## Anderson-Darling statistic 0.38231724 0.59500390 1.3172557
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 104.1850 105.1607 104.8533
## Bayesian Information Criterion 104.9808 105.9565 105.2512
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 5.040097e-04 1.453427e-05 1.891230e-07
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1852511 0.2000465 0.2477002
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 104.1850 105.1607 104.8533
## [1] "delta-T Fit c-scan 1 חשמל"
## [1] "Discrete delta-T Fit c-scan 1 חשמל"
## [1] "P-L GoF: 0.376858520909242"
## [1] "P-L xmin: 7"
## [1] "P-L pars: 2.08"

## [1] "L-N GoF: 0.254749167676184"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 1.96706867998128" "L-N pars: 1.46887561806741"
## [1] "LogNormal fit: 2.09790749211022 - -15.1920264739776"
## [2] "LogNormal fit: 1.32466631923048 - -15.1920264739776"
## [1] "Exponential fit: 0.0677966101694915 - -14.7649723311433"
## [1] "Poisson GoF: 0.332525909695209"
## [1] "Poisson xmin: 7"
## [1] "Poisson pars: 19.3276813708683"
## [1] "Exp GoF: 0.254431481197551"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.0702089635848397"
## [1] "Continuous delta-T Fit c-scan 1 חשמל"
## [1] "P-L GoF: 0.372035526990773"
## [1] "P-L xmin: 1"
## [1] "P-L pars: 1.5"

## [1] "L-N GoF: 0.165360196611844"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.79720052644499" "L-N pars: 0.619343826945503"
## [1] "Weibull GoF: 0.170917203016236"
## [1] "Weibull xmin: 1"
## [1] "Weibull pars: 2.1821406595356" "Weibull pars: 21.8301653578701"
## [1] "Exp GoF: 0.253403036058394"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.07"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 30
## median: 14
## mean: 14.75
## estimated sd: 13.1751
## estimated skewness: 0.2115237
## estimated kurtosis: 0.00554589
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 1.040925 0.4447485
## scale 14.962030 7.5332612
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.097907 0.6623332
## sdlog 1.324666 0.4683391
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.06779661 0.03389093

## <simpleError in ans[!test & ok] <- rep(no, length.out = length(ans))[!test & ok]: replacement has length zero>
## NULL
## NULL
## NULL
## NULL
## [1] "delta-T Fit c-scan 1 מכונות"
## [1] "Discrete delta-T Fit c-scan 1 מכונות"
## [1] "P-L GoF: 0.275168255876939"
## [1] "P-L xmin: 23"
## [1] "P-L pars: 1.86"

## [1] "L-N GoF: 0.181274171355143"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.98724482081156" "L-N pars: 1.98519777584892"
## [1] "LogNormal fit: 3.1454179116161 - -30.9610139745639"
## [2] "LogNormal fit: 1.81450472363755 - -30.9610139745639"
## [1] "Exponential fit: 0.0143198090692124 - -31.4766687041645"
## [1] "Poisson GoF: 0.59963917760241"
## [1] "Poisson xmin: 6"
## [1] "Poisson pars: 83.6000000007646"
## [1] "Exp GoF: 0.193867880386319"
## [1] "Exp xmin: 6"
## [1] "Exp pars: 0.0128243460599411"
## [1] "Continuous delta-T Fit c-scan 1 מכונות"
## [1] "P-L GoF: 0.236564733257379"
## [1] "P-L xmin: 54"
## [1] "P-L pars: 2.52"

## [1] "L-N GoF: 0.109035402619679"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 3.7685490469563" "L-N pars: 1.26447723011276"
## [1] "Weibull GoF: 0.104983486305189"
## [1] "Weibull xmin: 1"
## [1] "Weibull pars: 0.862363279331308" "Weibull pars: 75.7542923428148"
## [1] "Exp GoF: 0.113706413500629"
## [1] "Exp xmin: 6"
## [1] "Exp pars: 0.01"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 251
## median: 38.5
## mean: 69.83333
## estimated sd: 94.10508
## estimated skewness: 1.89209
## estimated kurtosis: 6.757643
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.683037 0.2236298
## scale 54.748406 34.4922749
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 3.145418 0.7407685
## sdlog 1.814505 0.5238017
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.01431981 0.005817364

## <simpleError in ans[!test & ok] <- rep(no, length.out = length(ans))[!test & ok]: replacement has length zero>
## NULL
## NULL
## NULL
## NULL
## [1] "delta-T Fit c-scan 1 מסגרות"
## [1] "Discrete delta-T Fit c-scan 1 מסגרות"
## [1] "P-L GoF: 0.190556850115865"
## [1] "P-L xmin: 10"
## [1] "P-L pars: 1.82"

## [1] "L-N GoF: 0.183515126506488"
## [1] "L-n xmin: 10"
## [1] "L-N pars: -36.3150997651328" "L-N pars: 7.077408319214"
## [1] "LogNormal fit: 2.60637292021829 - -37.0102245354782"
## [2] "LogNormal fit: 1.8238809365582 - -37.0102245354782"
## [1] "Exponential fit: 0.0165631469979296 - -40.8046008957819"
## [1] "Poisson GoF: 0.666666666666667"
## [1] "Poisson xmin: 25"
## [1] "Poisson pars: 144.999999447499"
## [1] "Exp GoF: 0.408581266014371"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.0167066941843753"
## [1] "Continuous delta-T Fit c-scan 1 מסגרות"
## [1] "P-L GoF: 0.191527923514386"
## [1] "P-L xmin: 10"
## [1] "P-L pars: 1.85"

## [1] "L-N GoF: 0.109885473139632"
## [1] "L-n xmin: 10"
## [1] "L-N pars: 0.427466820843106" "L-N pars: 2.44703497662136"
## [1] "Weibull GoF: 0.111082276000664"
## [1] "Weibull xmin: 10"
## [1] "Weibull pars: 0.197851623927881" "Weibull pars: 0.0570310283675004"
## [1] "Exp GoF: 0.243783391806141"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.02"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 367
## median: 18
## mean: 60.375
## estimated sd: 124.6847
## estimated skewness: 2.758435
## estimated kurtosis: 10.69682
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.5666443 0.1473844
## scale 33.8326126 22.3911844
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.606373 0.6448393
## sdlog 1.823881 0.4559696
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.01656315 0.00583452

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.19305542 0.1838577 0.4109489
## Cramer-von Mises statistic 0.05776599 0.0522442 0.4054062
## Anderson-Darling statistic 0.39505865 0.3681344 2.7128028
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 79.08815 78.02045 83.60920
## Bayesian Information Criterion 79.24703 78.17933 83.68864
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 1.325362e-01 3.775253e-02 4.138875e-07
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1930554 0.1838577 0.4109489
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 79.08815 78.02045 83.60920
## [1] "delta-T Fit eastman 0 בקרות"
## [1] "Discrete delta-T Fit eastman 0 בקרות"
## [1] "P-L GoF: 0.125261616995327"
## [1] "P-L xmin: 4"
## [1] "P-L pars: 1.88"

## [1] "L-N GoF: 0.123898202383492"
## [1] "L-n xmin: 2"
## [1] "L-N pars: 1.80560777388331" "L-N pars: 1.25287475787533"
## [1] "LogNormal fit: 2.03404073676959 - -88.1749545115155"
## [2] "LogNormal fit: 1.07682716862916 - -88.1749545115155"
## [1] "Exponential fit: 0.0741839762611276 - -90.030177637104"
## [1] "Poisson GoF: 0.159068331221766"
## [1] "Poisson xmin: 38"
## [1] "Poisson pars: 34.9899767658227"
## [1] "Exp GoF: 0.170245276446076"
## [1] "Exp xmin: 38"
## [1] "Exp pars: 0.245123826402977"
## [1] "Continuous delta-T Fit eastman 0 בקרות"
## [1] "P-L GoF: 0.139888959431109"
## [1] "P-L xmin: 4"
## [1] "P-L pars: 1.98"

## [1] "L-N GoF: 0.125709678311469"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.03973727117537" "L-N pars: 1.09352790323818"
## [1] "Weibull GoF: 0.125225895067318"
## [1] "Weibull xmin: 1"
## [1] "Weibull pars: 0.781254338134218" "Weibull pars: 10.3910009023713"
## [1] "Exp GoF: 0.171209063848815"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.08"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 47
## median: 7
## mean: 13.48
## estimated sd: 15.00311
## estimated skewness: 1.375875
## estimated kurtosis: 3.336093
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.9627882 0.1451443
## scale 13.2316809 2.9178858
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.034041 0.2153654
## sdlog 1.076827 0.1522858
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.07418398 0.0148341

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.1815708 0.13177463 0.1929095
## Cramer-von Mises statistic 0.1531176 0.07118115 0.1760808
## Anderson-Darling statistic 0.9704602 0.54099081 1.0736607
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 183.9956 180.3499 182.0604
## Bayesian Information Criterion 186.4333 182.7877 183.2792
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1527922 0.1813628 0.1925805
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1815708 0.1317746 0.1929095
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 183.9956 180.3499 182.0604
## [1] "delta-T Fit eastman 0 חשמל"
## [1] "Continuous delta-T Fit eastman 0 חשמל"
## [1] "P-L GoF: 0.58060037008428"
## [1] "P-L xmin: 1"
## [1] "P-L pars: 1.5"

## [1] "L-N GoF: Inf"
## [1] "L-n xmin: NA"
## [1] "L-N pars: NA" "L-N pars: NA"
## [1] "Weibull GoF: Inf"
## [1] "Weibull xmin: NA"
## [1] "Weibull pars: NA" "Weibull pars: NA"
## [1] "Exp GoF: 0.404820998086341"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.01"
## [1] "delta-T Fit eastman 0 מכונות"
## [1] "Discrete delta-T Fit eastman 0 מכונות"
## [1] "P-L GoF: 0.230477858277193"
## [1] "P-L xmin: 5"
## [1] "P-L pars: 1.65"

## [1] "L-N GoF: 0.148894043934623"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 1.37960610245275" "L-N pars: 2.26566192620745"
## [1] "LogNormal fit: 2.14050284586397 - -40.9566822791855"
## [2] "LogNormal fit: 1.70954430868193 - -40.9566822791855"
## [1] "Exponential fit: 0.0364963503649635 - -43.1054301339402"
## [1] "Poisson GoF: 0.327203410204697"
## [1] "Poisson xmin: 20"
## [1] "Poisson pars: 62.999999996438"
## [1] "Exp GoF: 0.252473520641105"
## [1] "Exp xmin: 8"
## [1] "Exp pars: 0.0224875407933274"
## [1] "Continuous delta-T Fit eastman 0 מכונות"
## [1] "P-L GoF: 0.222838951112749"
## [1] "P-L xmin: 55"
## [1] "P-L pars: 4.31"

## [1] "L-N GoF: 0.144544975666454"
## [1] "L-n xmin: 8"
## [1] "L-N pars: 3.97881786876879" "L-N pars: 0.620276740211956"
## [1] "Weibull GoF: 0.13862774986959"
## [1] "Weibull xmin: 8"
## [1] "Weibull pars: 2.06432395251355" "Weibull pars: 70.3289326011156"
## [1] "Exp GoF: 0.205441268422999"
## [1] "Exp xmin: 5"
## [1] "Exp pars: 0.03"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 107
## median: 7
## mean: 27.4
## estimated sd: 37.11005
## estimated skewness: 1.409769
## estimated kurtosis: 3.96401
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.6491022 0.1608145
## scale 20.0026105 10.3216099
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.140503 0.5406054
## sdlog 1.709544 0.3822651
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.03649635 0.01153249

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.17600168 0.19473141 0.3467903
## Cramer-von Mises statistic 0.06544343 0.05667249 0.2901606
## Anderson-Darling statistic 0.44255091 0.44621925 2.0701806
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 86.55333 85.91336 88.21086
## Bayesian Information Criterion 87.15850 86.51853 88.51345
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 1.198837e-01 4.018082e-02 3.180198e-05
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1760017 0.1947314 0.3467903
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 86.55333 85.91336 88.21086
## [1] "delta-T Fit matec 0 בקרות"
## [1] "Discrete delta-T Fit matec 0 בקרות"
## [1] "P-L GoF: 0.255502296412549"
## [1] "P-L xmin: 3"
## [1] "P-L pars: 1.53"

## [1] "L-N GoF: 0.177379210025049"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.52605832988641" "L-N pars: 1.26270126879156"
## [1] "LogNormal fit: 2.5455930774047 - -41.7559703702999"
## [2] "LogNormal fit: 1.23499315359971 - -41.7559703702999"
## [1] "Exponential fit: 0.0452488687782805 - -40.9557760852371"
## [1] "Poisson GoF: 0.248947029931919"
## [1] "Poisson xmin: 24"
## [1] "Poisson pars: 41.4747287254861"
## [1] "Exp GoF: 0.138993347192171"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.0463117678176598"
## [1] "Continuous delta-T Fit matec 0 בקרות"
## [1] "P-L GoF: 0.107114899641491"
## [1] "P-L xmin: 40"
## [1] "P-L pars: 5"

## [1] "L-N GoF: 0.127670270414678"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.82371845413184" "L-N pars: 0.952896922519687"
## [1] "Weibull GoF: 0.12007796586788"
## [1] "Weibull xmin: 1"
## [1] "Weibull pars: 1.24507891221631" "Weibull pars: 25.7224223471387"
## [1] "Exp GoF: 0.16712891630192"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.05"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 58
## median: 18.5
## mean: 22.1
## estimated sd: 19.51324
## estimated skewness: 0.7223897
## estimated kurtosis: 2.327882
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 1.05869 0.2750391
## scale 22.56857 7.0874040
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.545593 0.3905391
## sdlog 1.234993 0.2761520
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.04524887 0.01430196

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.14005439 0.18355225 0.14680112
## Cramer-von Mises statistic 0.03220234 0.04585695 0.02922697
## Anderson-Darling statistic 0.21636845 0.31185660 0.19268596
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 85.86467 87.51194 83.91155
## Bayesian Information Criterion 86.46984 88.11711 84.21414
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.4646374 0.5021864 0.7688016
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1400544 0.1835523 0.1468011
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 85.86467 87.51194 83.91155
## [1] "delta-T Fit matec 0 חשמל"
## [1] "Discrete delta-T Fit matec 0 חשמל"
## [1] "P-L GoF: 0.204797746116795"
## [1] "P-L xmin: 55"
## [1] "P-L pars: 4.35"

## [1] "L-N GoF: 0.189900591822051"
## [1] "L-n xmin: 1"
## [1] "L-N pars: 2.77623994611813" "L-N pars: 1.74374099826551"
## [1] "LogNormal fit: 2.8849178726514 - -47.8393820377303"
## [2] "LogNormal fit: 1.61620659911928 - -47.8393820377303"
## [1] "Exponential fit: 0.0251256281407035 - -46.8386691229039"
## [1] "Poisson GoF: 0.331548617304183"
## [1] "Poisson xmin: 22"
## [1] "Poisson pars: 62.1666666119432"
## [1] "Exp GoF: 0.174863072438885"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.025458256370923"
## [1] "Continuous delta-T Fit matec 0 חשמל"
## [1] "P-L GoF: 0.193196797746843"
## [1] "P-L xmin: 55"
## [1] "P-L pars: 4.46"

## [1] "L-N GoF: 0.0981991594481098"
## [1] "L-n xmin: 12"
## [1] "L-N pars: 3.99015998069422" "L-N pars: 0.537162374619152"
## [1] "Weibull GoF: 0.100943316694542"
## [1] "Weibull xmin: 12"
## [1] "Weibull pars: 1.8829982879075" "Weibull pars: 67.8183760640626"
## [1] "Exp GoF: 0.148266489110823"
## [1] "Exp xmin: 12"
## [1] "Exp pars: 0.02"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 126
## median: 31
## mean: 39.8
## estimated sd: 39.31582
## estimated skewness: 1.170059
## estimated kurtosis: 4.340788
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.8553985 0.2258141
## scale 37.1361132 14.3896642
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.884918 0.5110894
## sdlog 1.616207 0.3613942
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.02512563 0.007932812

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.15560091 0.19055968 0.17518739
## Cramer-von Mises statistic 0.04690284 0.08950561 0.05160447
## Anderson-Darling statistic 0.37401145 0.63002415 0.53291617
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 97.30357 99.67876 95.67734
## Bayesian Information Criterion 97.90874 100.28393 95.97992
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.034796131 0.007166656 0.003735551
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.1556009 0.1905597 0.1751874
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 97.30357 99.67876 95.67734
## [1] "delta-T Fit matec 0 מכונות"
## [1] "Discrete delta-T Fit matec 0 מכונות"
## [1] "P-L GoF: 0.24581176003265"
## [1] "P-L xmin: 36"
## [1] "P-L pars: 3.43"

## [1] "L-N GoF: 0.250810062885285"
## [1] "L-n xmin: 36"
## [1] "L-N pars: -11.3924454247368" "L-N pars: 2.5451602888326"
## [1] "LogNormal fit: 2.74056291908273 - -41.8191629285323"
## [2] "LogNormal fit: 1.62754412430043 - -41.8191629285323"
## [1] "Exponential fit: 0.0284810126582278 - -41.0266587262562"
## [1] "Poisson GoF: 0.343553632441104"
## [1] "Poisson xmin: 9"
## [1] "Poisson pars: 44.857142818652"
## [1] "Exp GoF: 0.193733379694582"
## [1] "Exp xmin: 1"
## [1] "Exp pars: 0.02890252544175"
## [1] "Continuous delta-T Fit matec 0 מכונות"
## [1] "P-L GoF: 0.190986759208744"
## [1] "P-L xmin: 36"
## [1] "P-L pars: 3.52"

## [1] "L-N GoF: 0.123338721276484"
## [1] "L-n xmin: 9"
## [1] "L-N pars: 3.725555298595" "L-N pars: 0.664790281252028"
## [1] "Weibull GoF: 0.11586550710392"
## [1] "Weibull xmin: 9"
## [1] "Weibull pars: 1.63090291170147" "Weibull pars: 54.1043761026682"
## [1] "Exp GoF: 0.186627861066553"
## [1] "Exp xmin: 36"
## [1] "Exp pars: 0.04"
## [1] "cont fit+"
## summary statistics
## ------
## min: 1 max: 106
## median: 36
## mean: 35.11111
## estimated sd: 34.68229
## estimated skewness: 1.083292
## estimated kurtosis: 3.927276
## Fitting of the distribution ' weibull ' by maximum likelihood
## Parameters:
## estimate Std. Error
## shape 0.8426286 0.235534
## scale 32.5084284 13.482238
## Fitting of the distribution ' lnorm ' by maximum likelihood
## Parameters:
## estimate Std. Error
## meanlog 2.740563 0.5425147
## sdlog 1.627544 0.3836152
## Fitting of the distribution ' exp ' by maximum likelihood
## Parameters:
## estimate Std. Error
## rate 0.02848101 0.00948195

## Goodness-of-fit statistics
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Kolmogorov-Smirnov statistic 0.2192610 0.25330245 0.19687262
## Cramer-von Mises statistic 0.0585795 0.09333032 0.06521154
## Anderson-Darling statistic 0.4151978 0.62413920 0.60174563
##
## Goodness-of-fit criteria
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## Akaike's Information Criterion 85.65115 87.63833 84.05332
## Bayesian Information Criterion 86.04560 88.03278 84.25054
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.017154793 0.008075079 0.001666819
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 0.2192610 0.2533024 0.1968726
## 1-mle-weibull 2-mle-lnorm 3-mle-exp
## 85.65115 87.63833 84.05332
close(f)