ExamFI1_C1415. Lídia Montero. Thursday, January 15, 2015

Size: px
Start display at page:

Download "ExamFI1_C1415. Lídia Montero. Thursday, January 15, 2015"

Transcription

1 ExamFI1_C1415 Lídia Motero Thursday, Jauary 15, 015 Problem Descriptio: Budget Share of Food for Spaish Households is discussed. We have a cross-sectio dataset from 1980 ad 397 observatios related to households. Data is icluded i library Ecdat ad ca be loaded usig the data(budgetfood) commad. BudgetFood dataframe cotais: wfood percetage of total expediture which the household has spet o food totexp total expediture of the household age age of referece perso i the household size size of the household tow size of the tow where the household is placed categorised ito 5 groups: 1 for small tows, 5 for big oes sex sex of referece perso (ma,woma) Source: Delgado, A. ad Jua Mora (1998) Testig o ested semiparametric models : a applicatio to Egel curves specificatio, Joural of Applied Ecoometrics, 13(), I the ext questios a df subset without NA data ad 0 expediture i food is cosidered.a ew variable is defied cosistig o the total expediture i food per perso i household i euros, totfoodp. 1 #setwd("g:/lidia/mltm-mcaid/examens/curs1415/fi1exam") library(ecdat) library(car) library(effects) library(momets) data(budgetfood) ls() [1] "BudgetFood" "df" "ll" "m" "std" df<-budgetfood[!is.a(budgetfood$sex),] summary(df) wfood totexp age size Mi. :0.000 Mi. : Mi. :16.0 Mi. : st Qu.:0.58 1st Qu.: st Qu.:38.0 1st Qu.:.00 Media :0.364 Media : Media :50.0 Media : 4.00 Mea :0.378 Mea : Mea :50.5 Mea : rd Qu.: rd Qu.: rd Qu.:6.0 3rd Qu.: 5.00 Max. :0.997 Max. : Max. :99.0 Max. :17.00 tow sex Mi. :1.00 ma :064 1st Qu.:.00 woma: 3347 Media :4.00 Mea :3.4

2 3rd Qu.:4.00 Max. :5.00 df$totfoodp<-(df$totexp*df$wfood/df$size)/ ll<-which(df$totfoodp0);legth(ll) [1] 60 df<-df[-ll,] Descriptive results (umerical summaries ad graphical represetatios) are provided for the ew variable totfoodp. Let us discuss the distributio fittig for the target variable totfoodp. summary(df) wfood totexp age size Mi. : Mi. : 1616 Mi. :16.0 Mi. : 1.0 1st Qu.: st Qu.: st Qu.:38.0 1st Qu.:.0 Media : Media : Media :50.0 Media : 4.0 Mea : Mea : Mea :50.5 Mea : 3.7 3rd Qu.: rd Qu.: rd Qu.:61.0 3rd Qu.: 5.0 Max. : Max. : Max. :99.0 Max. :17.0 tow sex totfoodp Mi. :1.00 ma :0581 Mi. : 3 1st Qu.:.00 woma: st Qu.: 316 Media :4.00 Media : 49 Mea :3.4 Mea : 488 3rd Qu.:4.00 3rd Qu.: 589 Max. :5.00 Max. :5141 dim(df) [1] all.momets(df$totfoodp,order.max4, cetralt) [1] 1.000e+00.79e e e e+11 all.momets(df$totfoodp,order.max4) [1] 1.000e e e e e+11 Warig: package 'FAdist' was built uder R versio 3.1. [1] [1] 0.536

3 1. Calculate the upper threshold values i the euros per capita expediture i food that defie mild ad extreme outliers i some exploratory data aalysis tools as a boxplot. quatile((df$totfoodp),c(0.75))+1.5*iqr((df$totfoodp)) 75% quatile((df$totfoodp),c(0.75))+3*iqr((df$totfoodp)) 75% Summary data for totfoodp target shows Q1 ad Q3 that allow to calculate the mild ad severe thresholds for outliers used commoly i boxplots: ad Calculate ad iterpret the skewess of totfoodp variable. The skewess of a radom variable X is defied as the third stadardized momet. It is usually deoted γ_1 ad correspods to the ratio of the third cetral momet, μ_3 ito the cubic power of the stadard deviatio e+07/(sd(df$totfoodp)^3) [1] skewess(df$totfoodp) [1] # With all.momets(,cetralt) data e+07/sqrt( e+04)^3 [1] Defie a list with o less tha 3 cadidate distributios that you cosider suitable for the target variable. Justify your criteria. Per cápita euro expediture i food is a o-discrete ad o-egative variable that accordig to the histogram is ot symmetric, i fact has positive skewess which meas to be log-right tailed. Cadidate distributios are loglogistic (blue), logormal (red), Weibull (orage),

4 Gamma ad Pareto. Goodess of fit is ot satisfactory to ay of them sice too extreme outliers are preset, but loglogistic distributio is the best cadidate i the list. Loglogistic distributio is kow i Ecoomy as Fisk distributio oe a trasformatio of the parametrizatio is performed. 4. A quick ad dirty procedure for distributio fittig produces some estimates for parameters ivolved i a Fisk distributio. The parameter alpha is a scale parameter ad is also the media of the distributio. The parameter beta is a shape parameter. The cumulative distributio fuctio ad the momets (ocetral, raw) are "E" [X_^k ]α^k (k π β)/sia(k π β) ad F(x)1/(1+(x/alpha)^(-beta)). Calculate theoretical momets ad compare to empirical momets (mea ad variace is eough, remember that the variace is the raw secod order momet mius the squared mea, i.e. V[X]E[X]- E[X]). library(fadist) library(mass) Attachig package: 'MASS' The followig object is masked from 'package:ecdat': SP500 fitdistr(df$totfoodp,"weibull") shape scale 1.856e e+0 (8.048e-03) (.036e+00) fitdistr(df$totfoodp,"logormal") mealog sdlog ( ) (0.0045) fitdistr(log(df$totfoodp),"logistic") locatio scale ( ) ( ) # Fisk parameters alpha is related to scale: exp( ) # beta is related to shape: 1/ alfaexp( ) beta 1/ # Theoretical mea for Fisk: alfa*(pi/beta)/si(pi/beta) # mea E[X] [1] ((alfa)^)*(*pi/beta)/si(*pi/beta) # E[X^] [1] ((alfa)^3)*(3*pi/beta)/si(3*pi/beta) # E[X^3] [1] (((alfa)^)*(*pi/beta)/si(*pi/beta))-((alfa*(pi/beta)/si(pi/beta))^ )# V[ X] E[X^]-E[X]^ [1] 9688 all.momets(df$totfoodp,order.max4, cetralf) [1] 1.000e e e e e+11 all.momets(df$totfoodp,order.max4, cetralt) [1] 1.000e+00.79e e e e+11 ks.test(log(df$totfoodp),"dlogis",scale ,locatio )

5 Warig: ties should ot be preset for the Kolmogorov-Smirov test Oe-sample Kolmogorov-Smirov test data: log(df$totfoodp) D , p-value <.e-16 alterative hypothesis: two-sided # Null hypothesis rejected, sample size is too large Raw momets ad Variace ca be computed usig provided data. First to third raw momets do ot differ so much,i higher order raw momets more discrepacies are foud. Theoretical variace is 89915, but empirical oe is 7946, so ot far away. Loglogistic/Fisk distributios seems coveiet to the target data. Let us discuss the target variable totfoodp meas accordig to the size of the residet tow ad/or the geder of the cotact perso. We select a radom sample of 1000 observatios i the subset of observatios without the upper extreme outliers (0.5% of the larger observatios firstly removed). wfood totexp age size Mi. : Mi. : 1616 Mi. :16.0 Mi. : 1.0 1st Qu.: st Qu.: st Qu.:38.0 1st Qu.:.0 Media : Media : Media :50.0 Media : 4.0 Mea : Mea : Mea :50.5 Mea : 3.7 3rd Qu.: rd Qu.: rd Qu.:61.0 3rd Qu.: 5.0 Max. : Max. : Max. :99.0 Max. :17.0 tow sex totfoodp Mi. :1.00 ma :0581 Mi. : 3 1st Qu.:.00 woma: st Qu.: 316 Media :4.00 Media : 49 Mea :3.4 Mea : 488 3rd Qu.:4.00 3rd Qu.: 589 Max. :5.00 Max. : Boxplot(dfs$totfoodp~dfs$tow,colraibow(5),id.0)

6 Boxplot(dfs$totfoodp~dfs$sex,colraibow(),id.0) 6 fliger.test(dfs$totfoodp~dfs$tow) Fliger-Killee test of homogeeity of variaces

7 data: dfs$totfoodp by dfs$tow Fliger-Killee:med chi-squared 5.446, df 4, p-value kruskal.test(dfs$totfoodp~dfs$tow) Kruskal-Wallis rak sum test data: dfs$totfoodp by dfs$tow Kruskal-Wallis chi-squared 10.79, df 4, p-value wilcox.test(dfs$totfoodp~dfs$sex,alterative"greater") Wilcoxo rak sum test with cotiuity correctio data: dfs$totfoodp by dfs$sex W 50443, p-value 1 alterative hypothesis: true locatio shift is greater tha 0 pairwise.wilcox.test(dfs$totfoodp,dfs$tow,alterative"less") Pairwise comparisos usig Wilcoxo rak sum test data: dfs$totfoodp ad dfs$tow P value adjustmet method: holm 7 cor(dfs[,c(7,1:5)],method"spearma") totfoodp wfood totexp age size tow totfoodp wfood totexp age size tow library(factomier) Warig: package 'FactoMieR' was built uder R versio codes(dfs,um.var7) $quati correlatio p.value wfood e-17 totexp e-06 age e-06 size e-30

8 $quali R p.value sex e-06 $category Estimate p.value woma e-06 ma e Is the average per capita expediture i food (Euros) equal for all tow sizes?. Does the average expediture icrease whe tow size icreases or ot? Idicate exceptios you fid ad justify your argumets Accordig to Kruskal-Wallis o-parametric Test for equal meas i the groups defied by tow size, p value is 3% less tha the 5% usual threshold, so evidece to reject the ull hypothesis is foud. Also, i the pairwise test output mea of the target i tow size i is always less tha the mea i tow size j oce i F) as.factor(tow) sex e-06 as.factor(tow):sex Residuals Sigif. codes: 0 '' '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ``` summary(ma4) Call: lm(formula totfoodp ~ as.factor(tow) * sex, data dfs) Residuals: Mi 1Q Media 3Q Max Coefficiets: Estimate Std. Error t value Pr(> t ) (Itercept) <e-16 *** as.factor(tow) as.factor(tow) as.factor(tow) as.factor(tow) sexwoma as.factor(tow):sexwoma as.factor(tow)3:sexwoma as.factor(tow)4:sexwoma as.factor(tow)5:sexwoma Sigif. codes: 0 '***' '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 Residual stadard error: 41 o 990 degrees of freedom Multiple R-squared: 0.036, Adjusted R-squared: F-statistic: 3.71 o 9 ad 990 DF, p-value:

9 8. Which Two-Way Aova is cosistet with per capita expediture i food (Euros) data?. Justify your argumets Accordig to Aova(ma4) results iteractios betwee tow-size ad sex ad the mai towsize effect are ot sigificat. Thus a Oe-way aova model depedig o sex of the referece perso seems sigificace to explai average per capita food budget. 9. Iterpret the effect of sex i the Two-way Iteractive Aova model ma4 for the target variable The effect of a woma-referece HH o average per capita food budget i the smallest tow group is to icrease i 145. over the referece group (ma-referece). For tow size i group, the effect of woma-referece is (icreases average pc food budget i 13 compared to ma-referece HH). For tow size 3, beig a woma-referece HH decreases the target i 1 o average ( ). For tow size 4, beig a woma-referece HH (istead of ma-ref HH) icreases the target i aprox. Fially, i big cities, beig a woma-referece HH (istead of ma-ref HH) icreases the target i beig a woma-referece HH (istead of ma-ref HH) icreases the target i aprox. Coclusios are referred to the ma4 model, that does ot explai most of the variability of the target (explais 3%). So ot meaigful at all. Geeral liear models are to be cosidered for the ew target variable totexp, total expediture dim(dfs) [1] mm1<-lm(totexp~(i(100*wfood)+age+tow+poly(size,))*sex,datadfs) mm<-step(mm1,klog(1000)) 9 Start: AIC63 totexp ~ (I(100 * wfood) + age + tow + poly(size, )) * sex Df Sum of Sq RSS AIC - poly(size, ):sex 1.13e+1.6e tow:sex e+11.5e age:sex e+1.6e <oe>.5e I(100 * wfood):sex e+1.7e Step: AIC614 totexp ~ I(100 * wfood) + age + tow + poly(size, ) + sex + I(100 * wfood):sex + age:sex + tow:sex Df Sum of Sq RSS AIC - tow:sex e+10.6e age:sex e+1.7e <oe>.6e I(100 * wfood):sex e+1.8e poly(size, ) 4.49e+13.71e Step: AIC607 totexp ~ I(100 * wfood) + age + tow + poly(size, ) + sex +

10 I(100 * wfood):sex + age:sex Df Sum of Sq RSS AIC - age:sex e+1.7e <oe>.6e I(100 * wfood):sex 1.00e+1.8e tow 1.77e+1.9e poly(size, ) 4.5e+13.71e Step: AIC605 totexp ~ I(100 * wfood) + age + tow + poly(size, ) + sex + I(100 * wfood):sex Df Sum of Sq RSS AIC - age e+11.8e I(100 * wfood):sex e+1.9e <oe>.7e tow 1.87e+1.30e poly(size, ) 4.56e+13.73e Step: AIC600 totexp ~ I(100 * wfood) + tow + poly(size, ) + sex + I(100 * wfood):sex Df Sum of Sq RSS AIC - I(100 * wfood):sex e+1.9e <oe>.8e tow 1.74e+1.31e poly(size, ) 4.79e+13.76e Step: AIC6199 totexp ~ I(100 * wfood) + tow + poly(size, ) + sex Df Sum of Sq RSS AIC - sex e+10.9e <oe>.9e tow 1.96e+1.3e poly(size, ) 4.75e+13.77e I(100 * wfood) e e Step: AIC619 totexp ~ I(100 * wfood) + tow + poly(size, ) Df Sum of Sq RSS AIC <oe>.9e tow 1.91e+1.3e poly(size, ) 5.39e+13.83e I(100 * wfood) 1 7.7e e mm<-lm(totexp~(i(100*wfood)+tow+size+i(size^)),datadfs) summary(mm1) Call:

11 lm(formula totexp ~ (I(100 * wfood) + age + tow + poly(size, )) * sex, data dfs) Residuals: Mi 1Q Media 3Q Max Coefficiets: Estimate Std. Error t value Pr(> t ) (Itercept) <e-16 *** I(100 * wfood) <e-16 *** age * tow *** poly(size, ) <e-16 *** poly(size, ) sexwoma I(100 * wfood):sexwoma ** age:sexwoma * tow:sexwoma poly(size, )1:sexwoma * poly(size, ):sexwoma Sigif. codes: 0 '***' '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 Residual stadard error: o 988 degrees of freedom Multiple R-squared: 0.431, Adjusted R-squared: 0.45 F-statistic: 68.1 o 11 ad 988 DF, p-value: <e-16 summary(mm) 11 Call: lm(formula totexp ~ (I(100 * wfood) + tow + size + I(size^)), data dfs) Residuals: Mi 1Q Media 3Q Max Coefficiets: Estimate Std. Error t value Pr(> t ) (Itercept) < e-16 *** I(100 * wfood) < e-16 *** tow *** size e-11 *** I(size^) * --- Sigif. codes: 0 '***' '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 Residual stadard error: o 995 degrees of freedom Multiple R-squared: 0.41, Adjusted R-squared: F-statistic: 181 o 4 ad 995 DF, p-value: <e Write the equatios for the best geeral liear model that explais the total household expedidure. Idicate the coefficiet of determiatio for the model. Which is the average

12 expediture for a household i Barceloa havig as a referece perso a woma with 4 members o the mea for the rest of variables? coef(mm) (Itercept) I(100 * wfood) tow size I(size^) predict(mm,ewdatadata.frame(wfood ,tow5,size4)) total HH expediture i(100 wfood) tow size *size The model explais 4% of the variability of the total HH expediture. Accordig to the model mm: Barceloa is tow-size 5, the average wfood i % is 37.9 (see the summary at the begiig) ad family size is 4, the total HH expediture (i 1980 ptas, roughly 6000 ) Diagostics #iflueceidexplot(mm,id.7) iflueceplot(mm1,id.7) 1 StudRes Hat CookD

13 llc<-boxplot(cooks.distace(mm1),id.5,labelrow.ames(dfs)) 13 llr<-boxplot(rstudet(mm1),id.5,labelrow.ames(dfs))

14 11. Commet about the existece of large residuals. Which observatio has the largest leverage? Largest leverage belogs to 488, but lack of fit is ot preset. There are very large residuals i the positive part, this meas observed total HH expediture very, very large compared to model predictios (lack of fit). Observatio 1800 has a studet residual of 14!!!! Outliers i the total expediture are preset, the group of extremely rich people has to be cosidered separatelly. Assymetric structure i the residuals is detected Are there ifluece data i the selected sample? Idicate observatio idetifiers ad justify the aswer Ifluece data is related to Cook's distace, clearly observatios 1800, 1845 ad 7897 are ifluet data. The model is ot valid sice residuals are ot symmetric ad heterocedasticity might be preset. par(mfrowc(,)) plot(mm)

15 dfs[llc,] wfood totexp age size tow sex totfoodp ma woma ma woma ma Biary Respose: Let f.fo50 be a ew factor that idicates whether a household requests more tha 50% of its total expediture for food (high) or ot (low). This variable is the target variable. A table that relates the biary factor f.fo50 to the geder of the referece perso is icluded. dfs$f.fo50<-factor(ifelse(dfs$wfood<0.5,0,1),labelsc("low","high")) summary(dfs) wfood totexp age size Mi. : Mi. : 7176 Mi. :17.0 Mi. : st Qu.: st Qu.: st Qu.:39.0 1st Qu.:.00 Media : Media : Media :51.0 Media : 4.00 Mea : Mea : Mea :51.1 Mea : rd Qu.: rd Qu.: rd Qu.:63.0 3rd Qu.: 5.00 Max. : Max. : Max. :99.0 Max. :15.00 tow sex totfoodp f.fo50 Mi. :1.00 ma :846 Mi. : 5.9 low :777 1st Qu.:.00 woma:154 1st Qu.: 34.6 high:3 Media :4.00 Media : Mea :3.6 Mea : rd Qu.:4.00 3rd Qu.: Max. :5.00 Max. :178.0

16 xtabs(~sex+f.fo50,datadfs) f.fo50 sex low high ma woma 11 4 xtabs(~f.fo50,datadfs) f.fo50 low high m0<-glm(f.fo50~1,familybiomial,datadfs) m1<-glm(f.fo50~sex,familybiomial,datadfs) summary(m0) Call: glm(formula f.fo50 ~ 1, family biomial, data dfs) Deviace Residuals: Mi 1Q Media 3Q Max Coefficiets: Estimate Std. Error z value Pr(> z ) (Itercept) <e-16 *** --- Sigif. codes: 0 '***' '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 (Dispersio parameter for biomial family take to be 1) Null deviace: o 999 degrees of freedom Residual deviace: o 999 degrees of freedom AIC: 1063 Number of Fisher Scorig iteratios: 4 16 summary(m1) Call: glm(formula f.fo50 ~ sex, family biomial, data dfs) Deviace Residuals: Mi 1Q Media 3Q Max Coefficiets: Estimate Std. Error z value Pr(> z ) (Itercept) <e-16 *** sexwoma Sigif. codes: 0 '***' '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

17 (Dispersio parameter for biomial family take to be 1) Null deviace: o 999 degrees of freedom Residual deviace: o 998 degrees of freedom AIC: 1063 Number of Fisher Scorig iteratios: 4 aova(m0,m1,test"chisq") Aalysis of Deviace Table Model 1: f.fo50 ~ 1 Model : f.fo50 ~ sex Resid. Df Resid. Dev Df Deviace Pr(>Chi) Estimate a ull logit model (m0) statig that high food budget households do ot deped o the geder of the referece perso The costat is the atural logarithm of the odds of the margial probability of 'high food budget HH' (positive respoe), log(((181+4)/(665+11))) Estimate a logit model (m1) statig that high food budget households deped o the geder of the referece perso The costat is the atural logarithm of the odds of the probability of 'high food budget HH' (positive respoe) i the referece group (ma), log(((181)/(665))) The estimate for the dummy variable iterpreted as the additive effect o thelogit scale of beig a woma referece HH istead of ma (based level), the differece betwee the atural logarithm of the odds of the probability of 'high food budget HH' (positive respoe) i the referece group (ma), log(((181)/(665))) mius the atural logarithm of the odds of the probability of 'high food budget HH' (positive respose) i the alterative group (woma), log(((4)/(11))) ad this equals Iterpret the effect of the geder o the high food budget household i the logit, odds ad probability scales. Is geder of the referece perso a sigificat factor to explai the high food budget households Accordig to the Deviace test comparig models m0 ad m1, the ull hypothesis of equivalece betwee the models is accepted sice pvalue is greater tha the 5% usual threshold. Sex gross effect is ot sigificat. Beig a woma-hh istead of ma-hh icreased the logit of the probability of 'high food budget HH' (positive respose) by 0.3 uits Beig a woma-hh istead of ma-hh multiplies the odds of the probability of 'high food budget HH' (positive respose) by exp(0.3) Equivaletly, the odds are icreased 38%. Beig a woma-hh istead of ma-hh icreases the probability of 'high food budget HH' (positive respose) approximately by 0.3(1-0.33) uits.

18 Samplig Theory questios. Data icluded i the BudgetFood dataset is ot updated ad might be ot represetative for Catala households. We are iterested i the curret total household expediture ad probability of a high Budget i Food (more tha 50% of the total expediture). A radom sample without replacemet will be selected i the populatio of catala households. Accordig to IDESCAT the total umber of Catala households is i 011 ad i Barceloa urba area. Usig BudgetFood large dataset allows to obtai the variace of the household expediture i 01-Euro ^. Household expediture is estimated to be for household accordig to IDESCAT for 01 ad food budget is greater tha 50% of the total expediture i 14.6% of the households. vv<-((budgetfood$totexp)/ ) var(vv) [1] Calculate a 95% cofidece iterval for the average household expediture assumig a sample size 1000 households i Cataloia 95% Cofidece iterval for mea HH expediture: y z Vˆ µ [ y] y z Vˆ [ y] 0,995 Y + 0,995 y - z Vˆ [ y] µ y + z Vˆ [ ] Y y µ µ Y Y 18 ˆ y 1 S' N S' co z V ad where ( ) Determie the sample size to estimate the average household expediture i Cataloia for 015 with a absolute error less tha 3000 usig a cofidece level a0.05. Determie the sample size for the urba area of Barceloa EA 1 N [ y] z α V [ y] z α 1 S' z α S' β z 1 α S' β Cataloia N

19 ( + ) ( 1+ ) N ad for Barceloa N ( + ) ( 1+ ) N Determie the sample size to estimate the probability of eedig a Budget for Food that represets more tha 50% of the total household expediture i Cataloia for 015 with precisio of 5% usig a cofidece level a0.05. Repeat the sample size calculus for the urba area of Barceloa. 95% Cofidece iterval for a proportio: EA [ y] EA[ p] 1 pˆ ˆ z S' z z N N -1 ( 1 pˆ ) 0.146( ) 0 Sample size to esure the requested absolute precisio is: ( 0.146( ) ) Takig accout of populatio size, for Cataloia N ( + ) ( 1+ ) 1 N ad for Barceloa N ( + ) ( 1+ ) 1 N

Statistics for Economics & Business

Statistics for Economics & Business Statistics for Ecoomics & Busiess Cofidece Iterval Estimatio Learig Objectives I this chapter, you lear: To costruct ad iterpret cofidece iterval estimates for the mea ad the proportio How to determie

More information

A point estimate is the value of a statistic that estimates the value of a parameter.

A point estimate is the value of a statistic that estimates the value of a parameter. Chapter 9 Estimatig the Value of a Parameter Chapter 9.1 Estimatig a Populatio Proportio Objective A : Poit Estimate A poit estimate is the value of a statistic that estimates the value of a parameter.

More information

1 Random Variables and Key Statistics

1 Random Variables and Key Statistics Review of Statistics 1 Radom Variables ad Key Statistics Radom Variable: A radom variable is a variable that takes o differet umerical values from a sample space determied by chace (probability distributio,

More information

Chapter 8. Confidence Interval Estimation. Copyright 2015, 2012, 2009 Pearson Education, Inc. Chapter 8, Slide 1

Chapter 8. Confidence Interval Estimation. Copyright 2015, 2012, 2009 Pearson Education, Inc. Chapter 8, Slide 1 Chapter 8 Cofidece Iterval Estimatio Copyright 2015, 2012, 2009 Pearso Educatio, Ic. Chapter 8, Slide 1 Learig Objectives I this chapter, you lear: To costruct ad iterpret cofidece iterval estimates for

More information

4.5 Generalized likelihood ratio test

4.5 Generalized likelihood ratio test 4.5 Geeralized likelihood ratio test A assumptio that is used i the Athlete Biological Passport is that haemoglobi varies equally i all athletes. We wish to test this assumptio o a sample of k athletes.

More information

Estimating Proportions with Confidence

Estimating Proportions with Confidence Aoucemets: Discussio today is review for midterm, o credit. You may atted more tha oe discussio sectio. Brig sheets of otes ad calculator to midterm. We will provide Scatro form. Homework: (Due Wed Chapter

More information

Introduction to Probability and Statistics Chapter 7

Introduction to Probability and Statistics Chapter 7 Itroductio to Probability ad Statistics Chapter 7 Ammar M. Sarha, asarha@mathstat.dal.ca Departmet of Mathematics ad Statistics, Dalhousie Uiversity Fall Semester 008 Chapter 7 Statistical Itervals Based

More information

BASIC STATISTICS ECOE 1323

BASIC STATISTICS ECOE 1323 BASIC STATISTICS ECOE 33 SPRING 007 FINAL EXAM NAME: ID NUMBER: INSTRUCTIONS:. Write your ame ad studet ID.. You have hours 3. This eam must be your ow work etirely. You caot talk to or share iformatio

More information

point estimator a random variable (like P or X) whose values are used to estimate a population parameter

point estimator a random variable (like P or X) whose values are used to estimate a population parameter Estimatio We have oted that the pollig problem which attempts to estimate the proportio p of Successes i some populatio ad the measuremet problem which attempts to estimate the mea value µ of some quatity

More information

AY Term 2 Mock Examination

AY Term 2 Mock Examination AY 206-7 Term 2 Mock Examiatio Date / Start Time Course Group Istructor 24 March 207 / 2 PM to 3:00 PM QF302 Ivestmet ad Fiacial Data Aalysis G Christopher Tig INSTRUCTIONS TO STUDENTS. This mock examiatio

More information

. (The calculated sample mean is symbolized by x.)

. (The calculated sample mean is symbolized by x.) Stat 40, sectio 5.4 The Cetral Limit Theorem otes by Tim Pilachowski If you have t doe it yet, go to the Stat 40 page ad dowload the hadout 5.4 supplemet Cetral Limit Theorem. The homework (both practice

More information

Basic formula for confidence intervals. Formulas for estimating population variance Normal Uniform Proportion

Basic formula for confidence intervals. Formulas for estimating population variance Normal Uniform Proportion Basic formula for the Chi-square test (Observed - Expected ) Expected Basic formula for cofidece itervals sˆ x ± Z ' Sample size adjustmet for fiite populatio (N * ) (N + - 1) Formulas for estimatig populatio

More information

5. Best Unbiased Estimators

5. Best Unbiased Estimators Best Ubiased Estimators http://www.math.uah.edu/stat/poit/ubiased.xhtml 1 of 7 7/16/2009 6:13 AM Virtual Laboratories > 7. Poit Estimatio > 1 2 3 4 5 6 5. Best Ubiased Estimators Basic Theory Cosider agai

More information

18.S096 Problem Set 5 Fall 2013 Volatility Modeling Due Date: 10/29/2013

18.S096 Problem Set 5 Fall 2013 Volatility Modeling Due Date: 10/29/2013 18.S096 Problem Set 5 Fall 2013 Volatility Modelig Due Date: 10/29/2013 1. Sample Estimators of Diffusio Process Volatility ad Drift Let {X t } be the price of a fiacial security that follows a geometric

More information

Chapter 8 Interval Estimation. Estimation Concepts. General Form of a Confidence Interval

Chapter 8 Interval Estimation. Estimation Concepts. General Form of a Confidence Interval Chapter 8 Iterval Estimatio Estimatio Cocepts Usually ca't take a cesus, so we must make decisios based o sample data It imperative that we take the risk of samplig error ito accout whe we iterpret sample

More information

Lecture 4: Probability (continued)

Lecture 4: Probability (continued) Lecture 4: Probability (cotiued) Desity Curves We ve defied probabilities for discrete variables (such as coi tossig). Probabilities for cotiuous or measuremet variables also are evaluated usig relative

More information

These characteristics are expressed in terms of statistical properties which are estimated from the sample data.

These characteristics are expressed in terms of statistical properties which are estimated from the sample data. 0. Key Statistical Measures of Data Four pricipal features which characterize a set of observatios o a radom variable are: (i) the cetral tedecy or the value aroud which all other values are buched, (ii)

More information

An Empirical Study of the Behaviour of the Sample Kurtosis in Samples from Symmetric Stable Distributions

An Empirical Study of the Behaviour of the Sample Kurtosis in Samples from Symmetric Stable Distributions A Empirical Study of the Behaviour of the Sample Kurtosis i Samples from Symmetric Stable Distributios J. Marti va Zyl Departmet of Actuarial Sciece ad Mathematical Statistics, Uiversity of the Free State,

More information

Topic-7. Large Sample Estimation

Topic-7. Large Sample Estimation Topic-7 Large Sample Estimatio TYPES OF INFERENCE Ò Estimatio: É Estimatig or predictig the value of the parameter É What is (are) the most likely values of m or p? Ò Hypothesis Testig: É Decidig about

More information

CHAPTER 8 Estimating with Confidence

CHAPTER 8 Estimating with Confidence CHAPTER 8 Estimatig with Cofidece 8.2 Estimatig a Populatio Proportio The Practice of Statistics, 5th Editio Stares, Tabor, Yates, Moore Bedford Freema Worth Publishers Estimatig a Populatio Proportio

More information

Inferential Statistics and Probability a Holistic Approach. Inference Process. Inference Process. Chapter 8 Slides. Maurice Geraghty,

Inferential Statistics and Probability a Holistic Approach. Inference Process. Inference Process. Chapter 8 Slides. Maurice Geraghty, Iferetial Statistics ad Probability a Holistic Approach Chapter 8 Poit Estimatio ad Cofidece Itervals This Course Material by Maurice Geraghty is licesed uder a Creative Commos Attributio-ShareAlike 4.0

More information

Standard Deviations for Normal Sampling Distributions are: For proportions For means _

Standard Deviations for Normal Sampling Distributions are: For proportions For means _ Sectio 9.2 Cofidece Itervals for Proportios We will lear to use a sample to say somethig about the world at large. This process (statistical iferece) is based o our uderstadig of samplig models, ad will

More information

ST 305: Exam 2 Fall 2014

ST 305: Exam 2 Fall 2014 ST 305: Exam Fall 014 By hadig i this completed exam, I state that I have either give or received assistace from aother perso durig the exam period. I have used o resources other tha the exam itself ad

More information

Exam 1 Spring 2015 Statistics for Applications 3/5/2015

Exam 1 Spring 2015 Statistics for Applications 3/5/2015 8.443 Exam Sprig 05 Statistics for Applicatios 3/5/05. Log Normal Distributio: A radom variable X follows a Logormal(θ, σ ) distributio if l(x) follows a Normal(θ, σ ) distributio. For the ormal radom

More information

Lecture 4: Parameter Estimation and Confidence Intervals. GENOME 560 Doug Fowler, GS

Lecture 4: Parameter Estimation and Confidence Intervals. GENOME 560 Doug Fowler, GS Lecture 4: Parameter Estimatio ad Cofidece Itervals GENOME 560 Doug Fowler, GS (dfowler@uw.edu) 1 Review: Probability Distributios Discrete: Biomial distributio Hypergeometric distributio Poisso distributio

More information

Today: Finish Chapter 9 (Sections 9.6 to 9.8 and 9.9 Lesson 3)

Today: Finish Chapter 9 (Sections 9.6 to 9.8 and 9.9 Lesson 3) Today: Fiish Chapter 9 (Sectios 9.6 to 9.8 ad 9.9 Lesso 3) ANNOUNCEMENTS: Quiz #7 begis after class today, eds Moday at 3pm. Quiz #8 will begi ext Friday ad ed at 10am Moday (day of fial). There will be

More information

Chapter 8: Estimation of Mean & Proportion. Introduction

Chapter 8: Estimation of Mean & Proportion. Introduction Chapter 8: Estimatio of Mea & Proportio 8.1 Estimatio, Poit Estimate, ad Iterval Estimate 8.2 Estimatio of a Populatio Mea: σ Kow 8.3 Estimatio of a Populatio Mea: σ Not Kow 8.4 Estimatio of a Populatio

More information

The Likelihood Ratio Test

The Likelihood Ratio Test LM 05 Likelihood Ratio Test 1 The Likelihood Ratio Test The likelihood ratio test is a geeral purpose test desiged evaluate ested statistical models i a way that is strictly aalogous to the F-test for

More information

DESCRIPTION OF MATHEMATICAL MODELS USED IN RATING ACTIVITIES

DESCRIPTION OF MATHEMATICAL MODELS USED IN RATING ACTIVITIES July 2014, Frakfurt am Mai. DESCRIPTION OF MATHEMATICAL MODELS USED IN RATING ACTIVITIES This documet outlies priciples ad key assumptios uderlyig the ratig models ad methodologies of Ratig-Agetur Expert

More information

SCHOOL OF ACCOUNTING AND BUSINESS BSc. (APPLIED ACCOUNTING) GENERAL / SPECIAL DEGREE PROGRAMME

SCHOOL OF ACCOUNTING AND BUSINESS BSc. (APPLIED ACCOUNTING) GENERAL / SPECIAL DEGREE PROGRAMME All Right Reserved No. of Pages - 10 No of Questios - 08 SCHOOL OF ACCOUNTING AND BUSINESS BSc. (APPLIED ACCOUNTING) GENERAL / SPECIAL DEGREE PROGRAMME YEAR I SEMESTER I (Group B) END SEMESTER EXAMINATION

More information

ii. Interval estimation:

ii. Interval estimation: 1 Types of estimatio: i. Poit estimatio: Example (1) Cosider the sample observatios 17,3,5,1,18,6,16,10 X 8 X i i1 8 17 3 5 118 6 16 10 8 116 8 14.5 14.5 is a poit estimate for usig the estimator X ad

More information

5 Statistical Inference

5 Statistical Inference 5 Statistical Iferece 5.1 Trasitio from Probability Theory to Statistical Iferece 1. We have ow more or less fiished the probability sectio of the course - we ow tur attetio to statistical iferece. I statistical

More information

1. Suppose X is a variable that follows the normal distribution with known standard deviation σ = 0.3 but unknown mean µ.

1. Suppose X is a variable that follows the normal distribution with known standard deviation σ = 0.3 but unknown mean µ. Chapter 9 Exercises Suppose X is a variable that follows the ormal distributio with kow stadard deviatio σ = 03 but ukow mea µ (a) Costruct a 95% cofidece iterval for µ if a radom sample of = 6 observatios

More information

A random variable is a variable whose value is a numerical outcome of a random phenomenon.

A random variable is a variable whose value is a numerical outcome of a random phenomenon. The Practice of Statistics, d ed ates, Moore, ad Stares Itroductio We are ofte more iterested i the umber of times a give outcome ca occur tha i the possible outcomes themselves For example, if we toss

More information

Twitter: @Owe134866 www.mathsfreeresourcelibrary.com Prior Kowledge Check 1) State whether each variable is qualitative or quatitative: a) Car colour Qualitative b) Miles travelled by a cyclist c) Favourite

More information

NOTES ON ESTIMATION AND CONFIDENCE INTERVALS. 1. Estimation

NOTES ON ESTIMATION AND CONFIDENCE INTERVALS. 1. Estimation NOTES ON ESTIMATION AND CONFIDENCE INTERVALS MICHAEL N. KATEHAKIS 1. Estimatio Estimatio is a brach of statistics that deals with estimatig the values of parameters of a uderlyig distributio based o observed/empirical

More information

Confidence Intervals. CI for a population mean (σ is known and n > 30 or the variable is normally distributed in the.

Confidence Intervals. CI for a population mean (σ is known and n > 30 or the variable is normally distributed in the. Cofidece Itervals A cofidece iterval is a iterval whose purpose is to estimate a parameter (a umber that could, i theory, be calculated from the populatio, if measuremets were available for the whole populatio).

More information

Sampling Distributions and Estimation

Sampling Distributions and Estimation Cotets 40 Samplig Distributios ad Estimatio 40.1 Samplig Distributios 40. Iterval Estimatio for the Variace 13 Learig outcomes You will lear about the distributios which are created whe a populatio is

More information

Department of Mathematics, S.R.K.R. Engineering College, Bhimavaram, A.P., India 2

Department of Mathematics, S.R.K.R. Engineering College, Bhimavaram, A.P., India 2 Skewess Corrected Cotrol charts for two Iverted Models R. Subba Rao* 1, Pushpa Latha Mamidi 2, M.S. Ravi Kumar 3 1 Departmet of Mathematics, S.R.K.R. Egieerig College, Bhimavaram, A.P., Idia 2 Departmet

More information

CHAPTER 8: CONFIDENCE INTERVAL ESTIMATES for Means and Proportions

CHAPTER 8: CONFIDENCE INTERVAL ESTIMATES for Means and Proportions CHAPTER 8: CONFIDENCE INTERVAL ESTIMATES for Meas ad Proportios Itroductio: We wat to kow the value of a parameter for a populatio. We do t kow the value of this parameter for the etire populatio because

More information

Sampling Distributions and Estimation

Sampling Distributions and Estimation Samplig Distributios ad Estimatio T O P I C # Populatio Proportios, π π the proportio of the populatio havig some characteristic Sample proportio ( p ) provides a estimate of π : x p umber of successes

More information

B = A x z

B = A x z 114 Block 3 Erdeky == Begi 6.3 ============================================================== 1 / 8 / 2008 1 Correspodig Areas uder a ormal curve ad the stadard ormal curve are equal. Below: Area B = Area

More information

Bayes Estimator for Coefficient of Variation and Inverse Coefficient of Variation for the Normal Distribution

Bayes Estimator for Coefficient of Variation and Inverse Coefficient of Variation for the Normal Distribution Iteratioal Joural of Statistics ad Systems ISSN 0973-675 Volume, Number 4 (07, pp. 7-73 Research Idia Publicatios http://www.ripublicatio.com Bayes Estimator for Coefficiet of Variatio ad Iverse Coefficiet

More information

Confidence Intervals Introduction

Confidence Intervals Introduction Cofidece Itervals Itroductio A poit estimate provides o iformatio about the precisio ad reliability of estimatio. For example, the sample mea X is a poit estimate of the populatio mea μ but because of

More information

Chapter 10 - Lecture 2 The independent two sample t-test and. confidence interval

Chapter 10 - Lecture 2 The independent two sample t-test and. confidence interval Assumptios Idepedet Samples - ukow σ 1, σ - 30 or m 30 - Upooled case Idepedet Samples - ukow σ 1, σ - 30 or m 30 - Pooled case Idepedet samples - Pooled variace - Large samples Chapter 10 - Lecture The

More information

Supersedes: 1.3 This procedure assumes that the minimal conditions for applying ISO 3301:1975 have been met, but additional criteria can be used.

Supersedes: 1.3 This procedure assumes that the minimal conditions for applying ISO 3301:1975 have been met, but additional criteria can be used. Procedures Category: STATISTICAL METHODS Procedure: P-S-01 Page: 1 of 9 Paired Differece Experiet Procedure 1.0 Purpose 1.1 The purpose of this procedure is to provide istructios that ay be used for perforig

More information

Unbiased estimators Estimators

Unbiased estimators Estimators 19 Ubiased estimators I Chapter 17 we saw that a dataset ca be modeled as a realizatio of a radom sample from a probability distributio ad that quatities of iterest correspod to features of the model distributio.

More information

CHAPTER 8: CONFIDENCE INTERVAL ESTIMATES for Means and Proportions

CHAPTER 8: CONFIDENCE INTERVAL ESTIMATES for Means and Proportions CHAPTER 8: CONFIDENCE INTERVAL ESTIMATES for Meas ad Proportios Itroductio: I this chapter we wat to fid out the value of a parameter for a populatio. We do t kow the value of this parameter for the etire

More information

Exam 2. Instructor: Cynthia Rudin TA: Dimitrios Bisias. October 25, 2011

Exam 2. Instructor: Cynthia Rudin TA: Dimitrios Bisias. October 25, 2011 15.075 Exam 2 Istructor: Cythia Rudi TA: Dimitrios Bisias October 25, 2011 Gradig is based o demostratio of coceptual uderstadig, so you eed to show all of your work. Problem 1 You are i charge of a study

More information

Lecture 5: Sampling Distribution

Lecture 5: Sampling Distribution Lecture 5: Samplig Distributio Readigs: Sectios 5.5, 5.6 Itroductio Parameter: describes populatio Statistic: describes the sample; samplig variability Samplig distributio of a statistic: A probability

More information

ECON 5350 Class Notes Maximum Likelihood Estimation

ECON 5350 Class Notes Maximum Likelihood Estimation ECON 5350 Class Notes Maximum Likelihood Estimatio 1 Maximum Likelihood Estimatio Example #1. Cosider the radom sample {X 1 = 0.5, X 2 = 2.0, X 3 = 10.0, X 4 = 1.5, X 5 = 7.0} geerated from a expoetial

More information

BIOSTATS 540 Fall Estimation Page 1 of 72. Unit 6. Estimation. Use at least twelve observations in constructing a confidence interval

BIOSTATS 540 Fall Estimation Page 1 of 72. Unit 6. Estimation. Use at least twelve observations in constructing a confidence interval BIOSTATS 540 Fall 015 6. Estimatio Page 1 of 7 Uit 6. Estimatio Use at least twelve observatios i costructig a cofidece iterval - Gerald va Belle What is the mea of the blood pressures of all the studets

More information

x satisfying all regularity conditions. Then

x satisfying all regularity conditions. Then AMS570.01 Practice Midterm Exam Sprig, 018 Name: ID: Sigature: Istructio: This is a close book exam. You are allowed oe-page 8x11 formula sheet (-sided). No cellphoe or calculator or computer is allowed.

More information

Models of Asset Pricing

Models of Asset Pricing 4 Appedix 1 to Chapter Models of Asset Pricig I this appedix, we first examie why diversificatio, the holdig of may risky assets i a portfolio, reduces the overall risk a ivestor faces. The we will see

More information

Models of Asset Pricing

Models of Asset Pricing APPENDIX 1 TO CHAPTER 4 Models of Asset Pricig I this appedix, we first examie why diversificatio, the holdig of may risky assets i a portfolio, reduces the overall risk a ivestor faces. The we will see

More information

CAPITAL ASSET PRICING MODEL

CAPITAL ASSET PRICING MODEL CAPITAL ASSET PRICING MODEL RETURN. Retur i respect of a observatio is give by the followig formula R = (P P 0 ) + D P 0 Where R = Retur from the ivestmet durig this period P 0 = Curret market price P

More information

Models of Asset Pricing

Models of Asset Pricing APPENDIX 1 TO CHAPTER4 Models of Asset Pricig I this appedix, we first examie why diversificatio, the holdig of may risky assets i a portfolio, reduces the overall risk a ivestor faces. The we will see

More information

Binomial Model. Stock Price Dynamics. The Key Idea Riskless Hedge

Binomial Model. Stock Price Dynamics. The Key Idea Riskless Hedge Biomial Model Stock Price Dyamics The value of a optio at maturity depeds o the price of the uderlyig stock at maturity. The value of the optio today depeds o the expected value of the optio at maturity

More information

Introduction to Statistical Inference

Introduction to Statistical Inference Itroductio to Statistical Iferece Fial Review CH1: Picturig Distributios With Graphs 1. Types of Variable -Categorical -Quatitative 2. Represetatios of Distributios (a) Categorical -Pie Chart -Bar Graph

More information

Rafa l Kulik and Marc Raimondo. University of Ottawa and University of Sydney. Supplementary material

Rafa l Kulik and Marc Raimondo. University of Ottawa and University of Sydney. Supplementary material Statistica Siica 009: Supplemet 1 L p -WAVELET REGRESSION WITH CORRELATED ERRORS AND INVERSE PROBLEMS Rafa l Kulik ad Marc Raimodo Uiversity of Ottawa ad Uiversity of Sydey Supplemetary material This ote

More information

Maximum Empirical Likelihood Estimation (MELE)

Maximum Empirical Likelihood Estimation (MELE) Maximum Empirical Likelihood Estimatio (MELE Natha Smooha Abstract Estimatio of Stadard Liear Model - Maximum Empirical Likelihood Estimator: Combiatio of the idea of imum likelihood method of momets,

More information

Quantitative Analysis

Quantitative Analysis EduPristie www.edupristie.com Modellig Mea Variace Skewess Kurtosis Mea: X i = i Mode: Value that occurs most frequetly Media: Midpoit of data arraged i ascedig/ descedig order s Avg. of squared deviatios

More information

Combining imperfect data, and an introduction to data assimilation Ross Bannister, NCEO, September 2010

Combining imperfect data, and an introduction to data assimilation Ross Bannister, NCEO, September 2010 Combiig imperfect data, ad a itroductio to data assimilatio Ross Baister, NCEO, September 00 rbaister@readigacuk The probability desity fuctio (PDF prob that x lies betwee x ad x + dx p (x restrictio o

More information

Topic 14: Maximum Likelihood Estimation

Topic 14: Maximum Likelihood Estimation Toic 4: November, 009 As before, we begi with a samle X = (X,, X of radom variables chose accordig to oe of a family of robabilities P θ I additio, f(x θ, x = (x,, x will be used to deote the desity fuctio

More information

Lecture 5 Point Es/mator and Sampling Distribu/on

Lecture 5 Point Es/mator and Sampling Distribu/on Lecture 5 Poit Es/mator ad Samplig Distribu/o Fall 03 Prof. Yao Xie, yao.xie@isye.gatech.edu H. Milto Stewart School of Idustrial Systems & Egieerig Georgia Tech Road map Poit Es/ma/o Cofidece Iterval

More information

1 Estimating sensitivities

1 Estimating sensitivities Copyright c 27 by Karl Sigma 1 Estimatig sesitivities Whe estimatig the Greeks, such as the, the geeral problem ivolves a radom variable Y = Y (α) (such as a discouted payoff) that depeds o a parameter

More information

Monetary Economics: Problem Set #5 Solutions

Monetary Economics: Problem Set #5 Solutions Moetary Ecoomics oblem Set #5 Moetary Ecoomics: oblem Set #5 Solutios This problem set is marked out of 1 poits. The weight give to each part is idicated below. Please cotact me asap if you have ay questios.

More information

Sampling Distributions & Estimators

Sampling Distributions & Estimators API-209 TF Sessio 2 Teddy Svoroos September 18, 2015 Samplig Distributios & Estimators I. Estimators The Importace of Samplig Radomly Three Properties of Estimators 1. Ubiased 2. Cosistet 3. Efficiet I

More information

Online appendices from Counterparty Risk and Credit Value Adjustment a continuing challenge for global financial markets by Jon Gregory

Online appendices from Counterparty Risk and Credit Value Adjustment a continuing challenge for global financial markets by Jon Gregory Olie appedices from Couterparty Risk ad Credit Value Adjustmet a APPENDIX 8A: Formulas for EE, PFE ad EPE for a ormal distributio Cosider a ormal distributio with mea (expected future value) ad stadard

More information

CHAPTER 2 PRICING OF BONDS

CHAPTER 2 PRICING OF BONDS CHAPTER 2 PRICING OF BONDS CHAPTER SUARY This chapter will focus o the time value of moey ad how to calculate the price of a bod. Whe pricig a bod it is ecessary to estimate the expected cash flows ad

More information

0.1 Valuation Formula:

0.1 Valuation Formula: 0. Valuatio Formula: 0.. Case of Geeral Trees: q = er S S S 3 S q = er S S 4 S 5 S 4 q 3 = er S 3 S 6 S 7 S 6 Therefore, f (3) = e r [q 3 f (7) + ( q 3 ) f (6)] f () = e r [q f (5) + ( q ) f (4)] = f ()

More information

Research Article The Probability That a Measurement Falls within a Range of n Standard Deviations from an Estimate of the Mean

Research Article The Probability That a Measurement Falls within a Range of n Standard Deviations from an Estimate of the Mean Iteratioal Scholarly Research Network ISRN Applied Mathematics Volume 0, Article ID 70806, 8 pages doi:0.540/0/70806 Research Article The Probability That a Measuremet Falls withi a Rage of Stadard Deviatios

More information

Journal of Statistical Software

Journal of Statistical Software JSS Joural of Statistical Software Jue 2007, Volume 19, Issue 6. http://www.jstatsoft.org/ Ratioal Arithmetic Mathematica Fuctios to Evaluate the Oe-sided Oe-sample K-S Cumulative Samplig Distributio J.

More information

Appendix 1 to Chapter 5

Appendix 1 to Chapter 5 Appedix 1 to Chapter 5 Models of Asset Pricig I Chapter 4, we saw that the retur o a asset (such as a bod) measures how much we gai from holdig that asset. Whe we make a decisio to buy a asset, we are

More information

Estimating possible rate of injuries in coal mines

Estimating possible rate of injuries in coal mines A.G. MNUKHIN B.B. KOBYLANSKY Natioal Academy of Scieces of Ukraie Estimatig possible rate of ijuries i coal mies The article presets methods to calculate the values of ijury rates i mies. The authors demostrated

More information

r i = a i + b i f b i = Cov[r i, f] The only parameters to be estimated for this model are a i 's, b i 's, σe 2 i

r i = a i + b i f b i = Cov[r i, f] The only parameters to be estimated for this model are a i 's, b i 's, σe 2 i The iformatio required by the mea-variace approach is substatial whe the umber of assets is large; there are mea values, variaces, ad )/2 covariaces - a total of 2 + )/2 parameters. Sigle-factor model:

More information

of Asset Pricing R e = expected return

of Asset Pricing R e = expected return Appedix 1 to Chapter 5 Models of Asset Pricig EXPECTED RETURN I Chapter 4, we saw that the retur o a asset (such as a bod) measures how much we gai from holdig that asset. Whe we make a decisio to buy

More information

FOUNDATION ACTED COURSE (FAC)

FOUNDATION ACTED COURSE (FAC) FOUNDATION ACTED COURSE (FAC) What is the Foudatio ActEd Course (FAC)? FAC is desiged to help studets improve their mathematical skills i preparatio for the Core Techical subjects. It is a referece documet

More information

14.30 Introduction to Statistical Methods in Economics Spring 2009

14.30 Introduction to Statistical Methods in Economics Spring 2009 MIT OpeCourseWare http://ocwmitedu 430 Itroductio to Statistical Methods i Ecoomics Sprig 009 For iformatio about citig these materials or our Terms of Use, visit: http://ocwmitedu/terms 430 Itroductio

More information

We learned: $100 cash today is preferred over $100 a year from now

We learned: $100 cash today is preferred over $100 a year from now Recap from Last Week Time Value of Moey We leared: $ cash today is preferred over $ a year from ow there is time value of moey i the form of willigess of baks, busiesses, ad people to pay iterest for its

More information

DOWLING COLLEGE: School of Education Department of Educational Administration, Leadership, and Technology

DOWLING COLLEGE: School of Education Department of Educational Administration, Leadership, and Technology 1. Doe 2. Doe 3. Doe 4. Doe DOWLING COLLEGE: School of Educatio Departmet of Educatioal Admiistratio, Leadership, ad Techology 5. Calculate meas ad stadard deviatios for per capita icome ad total reveues

More information

A New Constructive Proof of Graham's Theorem and More New Classes of Functionally Complete Functions

A New Constructive Proof of Graham's Theorem and More New Classes of Functionally Complete Functions A New Costructive Proof of Graham's Theorem ad More New Classes of Fuctioally Complete Fuctios Azhou Yag, Ph.D. Zhu-qi Lu, Ph.D. Abstract A -valued two-variable truth fuctio is called fuctioally complete,

More information

of Asset Pricing APPENDIX 1 TO CHAPTER EXPECTED RETURN APPLICATION Expected Return

of Asset Pricing APPENDIX 1 TO CHAPTER EXPECTED RETURN APPLICATION Expected Return APPENDIX 1 TO CHAPTER 5 Models of Asset Pricig I Chapter 4, we saw that the retur o a asset (such as a bod) measures how much we gai from holdig that asset. Whe we make a decisio to buy a asset, we are

More information

1. Find the area under the standard normal curve between z = 0 and z = 3. (a) (b) (c) (d)

1. Find the area under the standard normal curve between z = 0 and z = 3. (a) (b) (c) (d) STA 2023 Practice 3 You may receive assistace from the Math Ceter. These problems are iteded to provide supplemetary problems i preparatio for test 3. This packet does ot ecessarily reflect the umber,

More information

CHANGE POINT TREND ANALYSIS OF GNI PER CAPITA IN SELECTED EUROPEAN COUNTRIES AND ISRAEL

CHANGE POINT TREND ANALYSIS OF GNI PER CAPITA IN SELECTED EUROPEAN COUNTRIES AND ISRAEL The 9 th Iteratioal Days of Statistics ad Ecoomics, Prague, September 0-, 05 CHANGE POINT TREND ANALYSIS OF GNI PER CAPITA IN SELECTED EUROPEAN COUNTRIES AND ISRAEL Lia Alatawa Yossi Yacu Gregory Gurevich

More information

Problem Set 1a - Oligopoly

Problem Set 1a - Oligopoly Advaced Idustrial Ecoomics Sprig 2014 Joha Steek 6 may 2014 Problem Set 1a - Oligopoly 1 Table of Cotets 2 Price Competitio... 3 2.1 Courot Oligopoly with Homogeous Goods ad Differet Costs... 3 2.2 Bertrad

More information

Math 124: Lecture for Week 10 of 17

Math 124: Lecture for Week 10 of 17 What we will do toight 1 Lecture for of 17 David Meredith Departmet of Mathematics Sa Fracisco State Uiversity 2 3 4 April 8, 2008 5 6 II Take the midterm. At the ed aswer the followig questio: To be revealed

More information

This article is part of a series providing

This article is part of a series providing feature Bryce Millard ad Adrew Machi Characteristics of public sector workers SUMMARY This article presets aalysis of public sector employmet, ad makes comparisos with the private sector, usig data from

More information

The Valuation of the Catastrophe Equity Puts with Jump Risks

The Valuation of the Catastrophe Equity Puts with Jump Risks The Valuatio of the Catastrophe Equity Puts with Jump Risks Shih-Kuei Li Natioal Uiversity of Kaohsiug Joit work with Chia-Chie Chag Outlie Catastrophe Isurace Products Literatures ad Motivatios Jump Risk

More information

EXERCISE - BINOMIAL THEOREM

EXERCISE - BINOMIAL THEOREM BINOMIAL THOEREM / EXERCISE - BINOMIAL THEOREM LEVEL I SUBJECTIVE QUESTIONS. Expad the followig expressios ad fid the umber of term i the expasio of the expressios. (a) (x + y) 99 (b) ( + a) 9 + ( a) 9

More information

The material in this chapter is motivated by Experiment 9.

The material in this chapter is motivated by Experiment 9. Chapter 5 Optimal Auctios The material i this chapter is motivated by Experimet 9. We wish to aalyze the decisio of a seller who sets a reserve price whe auctioig off a item to a group of bidders. We begi

More information

Labour Force Survey in Belarus: determination of sample size, sample design, statistical weighting

Labour Force Survey in Belarus: determination of sample size, sample design, statistical weighting Labour Force urvey i Belarus: determiatio of sample size, sample desig, statistical weightig Natallia Boku Belarus tate Ecoomic Uiversity, e-mail: ataliaboku@rambler.ru Abstract The first experiece of

More information

Measures of Location and Variability

Measures of Location and Variability Measures of Locatio ad Variability Sprig, 2009 Skill set: You should kow the defiitios of the major measures of locatio (mea, media, mode, geometric mea) ad variability (stadard deviatio, variace, stadard

More information

Anomaly Correction by Optimal Trading Frequency

Anomaly Correction by Optimal Trading Frequency Aomaly Correctio by Optimal Tradig Frequecy Yiqiao Yi Columbia Uiversity September 9, 206 Abstract Uder the assumptio that security prices follow radom walk, we look at price versus differet movig averages.

More information

Forecasting bad debt losses using clustering algorithms and Markov chains

Forecasting bad debt losses using clustering algorithms and Markov chains Forecastig bad debt losses usig clusterig algorithms ad Markov chais Robert J. Till Experia Ltd Lambert House Talbot Street Nottigham NG1 5HF {Robert.Till@uk.experia.com} Abstract Beig able to make accurate

More information

STRAND: FINANCE. Unit 3 Loans and Mortgages TEXT. Contents. Section. 3.1 Annual Percentage Rate (APR) 3.2 APR for Repayment of Loans

STRAND: FINANCE. Unit 3 Loans and Mortgages TEXT. Contents. Section. 3.1 Annual Percentage Rate (APR) 3.2 APR for Repayment of Loans CMM Subject Support Strad: FINANCE Uit 3 Loas ad Mortgages: Text m e p STRAND: FINANCE Uit 3 Loas ad Mortgages TEXT Cotets Sectio 3.1 Aual Percetage Rate (APR) 3.2 APR for Repaymet of Loas 3.3 Credit Purchases

More information

Predicting Market Data Using The Kalman Filter

Predicting Market Data Using The Kalman Filter Stocks & Commodities V. : (-5): Predictig Market Data Usig The Kalma Filter, Pt by R. Martielli & N. Rhoads The Future Ad The Filter Predictig Market Data Usig The Kalma Filter Ca the Kalma filter be used

More information

FINM6900 Finance Theory How Is Asymmetric Information Reflected in Asset Prices?

FINM6900 Finance Theory How Is Asymmetric Information Reflected in Asset Prices? FINM6900 Fiace Theory How Is Asymmetric Iformatio Reflected i Asset Prices? February 3, 2012 Referece S. Grossma, O the Efficiecy of Competitive Stock Markets where Traders Have Diverse iformatio, Joural

More information

Chpt 5. Discrete Probability Distributions. 5-3 Mean, Variance, Standard Deviation, and Expectation

Chpt 5. Discrete Probability Distributions. 5-3 Mean, Variance, Standard Deviation, and Expectation Chpt 5 Discrete Probability Distributios 5-3 Mea, Variace, Stadard Deviatio, ad Expectatio 1/23 Homework p252 Applyig the Cocepts Exercises p253 1-19 2/23 Objective Fid the mea, variace, stadard deviatio,

More information

43. A 000 par value 5-year bod with 8.0% semiaual coupos was bought to yield 7.5% covertible semiaually. Determie the amout of premium amortized i the 6 th coupo paymet. (A).00 (B).08 (C).5 (D).5 (E).34

More information