Resolução do exemplo 1 da aula da tarde - Dia 09/11
od <- c(1.2, 1.4, 1.4, 1.3, 1.2, 1.35, 1.4, 2.0, 1.95, 1.1, 1.75, 1.05, 1.05, 1.4)
od
## [1] 1.20 1.40 1.40 1.30 1.20 1.35 1.40 2.00 1.95 1.10 1.75 1.05 1.05 1.40
str(od)
## num [1:14] 1.2 1.4 1.4 1.3 1.2 1.35 1.4 2 1.95 1.1 ...
Estatísticas descritivas
summary(od)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 1.050 1.200 1.375 1.396 1.400 2.000
sort(od)
## [1] 1.05 1.05 1.10 1.20 1.20 1.30 1.35 1.40 1.40 1.40 1.40 1.75 1.95 2.00
Visualizando a distruibuição dos dados
boxplot(od-1.2, col = "lightgrey", ylab = "oxigênio dissolvido (mg/L)")
shapiro.test(od-1.2)
##
## Shapiro-Wilk normality test
##
## data: od - 1.2
## W = 0.86929, p-value = 0.041
t.test(od - 1.2, alternative = c(”two.sided”), mu = 0, conf.level = 0.95)
mean(od) - 1.2
As evidências do boxplot e do teste de Shapiro-Wilks indicam que os dados nao tem distruição aproximadamente normal, Entretanto, como exercicio, iremos utilizar o teste e o intervalo de confiança baseando na distribuição t para responder, inicialmente, a questão.
# Teste com alpha = 5%
t.test(od - 1.2, alternative = c("two.sided"), mu = 0, conf.level = 0.95)
##
## One Sample t-test
##
## data: od - 1.2
## t = 2.4068, df = 13, p-value = 0.03168
## alternative hypothesis: true mean is not equal to 0
## 95 percent confidence interval:
## 0.02010878 0.37274836
## sample estimates:
## mean of x
## 0.1964286
wilcox.test(od - 1.2, mu=0, conf.int = TRUE)
##
## Wilcoxon signed rank test with continuity correction
##
## data: od - 1.2
## V = 70, p-value = 0.01627
## alternative hypothesis: true location is not equal to 0
## 95 percent confidence interval:
## 0.0249788 0.4749679
## sample estimates:
## (pseudo)median
## 0.1999742
t.test(x, y = NULL
alternative = c(”two.sided”, ”less”, ”greater”)
mu = 0
paired = FALSE
var.equal = FALSE
conf.level = 0.95, ...)
library(pwr)
pwr.p.test (h = ES.h(p1 = 0.75, p2 = 0.50), sig.level = 0.05, power = 0.80, alternative = "greater")
##
## proportion power calculation for binomial distribution (arcsine transformation)
##
## h = 0.5235988
## n = 22.55126
## sig.level = 0.05
## power = 0.8
## alternative = greater