Consultoria Estatística

Introdução

Está atividade tem como principal objetivo analisar o banco de dados referente a pacientes de um Hospitais dea Paraíba, onde, o pesquisador tem como interesse descobrir se a variável de interesse GSM sofre influência das demais variáveis

Dados

head(dados)
##   MÉDICO RIM IMAGEM GSM
## 1      1   D      A  85
## 2      1   D      P 124
## 3      1   D      N  63
## 4      1   D      M  92
## 5      1   E      A  59
## 6      1   E      P 130

O Banco de dados consiste em 919 observações num total de 4 variáveis: Médico, Rim, Imagem e GSM.As iformações contidas nesse banco de dados próvem de paciêntes que estão em tratamento de seus rins.

attach(dados)
library(fBasics)
## Loading required package: timeDate
## Loading required package: timeSeries
library(psych)
## 
## Attaching package: 'psych'
## The following object is masked from 'package:fBasics':
## 
##     tr
## The following object is masked from 'package:timeSeries':
## 
##     outlier
require(fBasics)
require(ExpDes)
## Loading required package: ExpDes
## 
## Attaching package: 'ExpDes'
## The following object is masked from 'package:stats':
## 
##     ccf
require(nortest)
## Loading required package: nortest

Ánalise Descritiva

describe(dados)
##         vars   n  mean    sd median trimmed   mad min max range skew
## MÉDICO*    1 919  3.01  1.41      3    3.02  1.48   1   5     4 0.00
## RIM*       2 919  1.49  0.50      1    1.48  0.00   1   2     1 0.05
## IMAGEM*    3 919  2.50  1.12      3    2.50  1.48   1   4     3 0.00
## GSM        4 919 79.49 27.39     75   77.31 28.17  25 180   155 0.72
##         kurtosis   se
## MÉDICO*    -1.29 0.05
## RIM*       -2.00 0.02
## IMAGEM*    -1.36 0.04
## GSM         0.19 0.90
summary(dados)
##  MÉDICO  RIM     IMAGEM       GSM        
##  1:177   D:471   A:230   Min.   : 25.00  
##  2:188   E:448   P:229   1st Qu.: 58.00  
##  3:188           N:231   Median : 75.00  
##  4:178           M:229   Mean   : 79.49  
##  5:188                   3rd Qu.: 97.00  
##                          Max.   :180.00
histPlot(as.timeSeries(GSM))

Obteve-se uma breve análise descritiva dos dados, pode-se perceber que: As 4 variáveis tem medias próximas de suas medianas, também percebesse que a variável GSM têm um desvio padrão e amplitude consideravelmente alta. Aqui também pode-se ter acesso as respectivas frequências dos níveis das variáveis qualitativas. Com relação ao histograma, nota-se que a variavél GSM não apartenta seguir normalidade.

densityPlot(as.timeSeries(dados$GSM))

Aqui, observa-se o histograma da variável versus a distribuição teórica

qqnormPlot(as.timeSeries(dados$GSM))

No QQplot, nota-se que os dados não provém de uma ditribuição Normal

boxplot(dados$GSM, las= 2)

Observando o BoxPlot observa-se que existe valores fora dos intervalos.

ad.test(dados$GSM)
## 
##  Anderson-Darling normality test
## 
## data:  dados$GSM
## A = 9.9307, p-value < 2.2e-16

Pelo teste de Anderson Darling conclui-se com 5% de significância que a população não vem de uma distribuição Normal.

Tabela de frequência

#Frequência
XT<- xtabs( ~ MÉDICO + IMAGEM,
            data = dados)
XT
##       IMAGEM
## MÉDICO  A  P  N  M
##      1 44 44 45 44
##      2 47 47 47 47
##      3 47 47 47 47
##      4 45 44 45 44
##      5 47 47 47 47
#proporção
prop.table(XT, 
           margin = 1)
##       IMAGEM
## MÉDICO         A         P         N         M
##      1 0.2485876 0.2485876 0.2542373 0.2485876
##      2 0.2500000 0.2500000 0.2500000 0.2500000
##      3 0.2500000 0.2500000 0.2500000 0.2500000
##      4 0.2528090 0.2471910 0.2528090 0.2471910
##      5 0.2500000 0.2500000 0.2500000 0.2500000
#somatório
XB = xtabs(GSM ~MÉDICO+IMAGEM, 
           data = dados)
XB
##       IMAGEM
## MÉDICO    A    P    N    M
##      1 2895 4334 2523 3274
##      2 2774 4691 2502 3582
##      3 2650 4690 2466 3573
##      4 3268 5282 2709 3984
##      5 3952 6193 3117 4595
#medias
XS<- XB/XT
XS
##       IMAGEM
## MÉDICO         A         P         N         M
##      1  65.79545  98.50000  56.06667  74.40909
##      2  59.02128  99.80851  53.23404  76.21277
##      3  56.38298  99.78723  52.46809  76.02128
##      4  72.62222 120.04545  60.20000  90.54545
##      5  84.08511 131.76596  66.31915  97.76596

Observa-se logo acima a tabela de frequência médico x imagem em seguida a tabela de proporção, logo após temos a tabela que nos da o somatório de todos os GSM para cada par(tratamento) existente entre a interação medico x imagem e por fim a tabela de medias.

Teste não-paramétrico

O teste de Friedman é uma alternativa não paramétrica para o teste de experimentos em blocos ao acaso (RBD - Randon Blocks Design) na ANOVA regular. Ele substitui o RBD quando os pressupostos de normalidade não estão assegurados.

dados2<- aggregate(GSM, by = list(f= MÉDICO, m= IMAGEM), FUN = median)
dados2
##    f m     x
## 1  1 A  66.5
## 2  2 A  54.0
## 3  3 A  56.0
## 4  4 A  71.0
## 5  5 A  80.0
## 6  1 P  97.5
## 7  2 P 102.0
## 8  3 P 102.0
## 9  4 P 119.5
## 10 5 P 129.0
## 11 1 N  55.0
## 12 2 N  49.0
## 13 3 N  51.0
## 14 4 N  57.0
## 15 5 N  67.0
## 16 1 M  74.0
## 17 2 M  76.0
## 18 3 M  76.0
## 19 4 M  90.5
## 20 5 M  97.0
friedman.test(dados2$x, dados2$f, dados2$m)
## 
##  Friedman rank sum test
## 
## data:  dados2$x, dados2$f and dados2$m
## Friedman chi-squared = 13.333, df = 4, p-value = 0.009757

Após realização do teste de Friedman vimos que com base no nosso p-valor rejeitamos a hipótese nula tanto para 5% quanto pra 1%.

Teste de comparações multiplas

Usando o teste de comparações múltiplas de Friedman com 5% de significância para analisar se existe diferença significativa entre os médicos dentro do tipo de imagens.

require(agricolae)
## Loading required package: agricolae
## 
## Attaching package: 'agricolae'
## The following objects are masked from 'package:ExpDes':
## 
##     lastC, order.group, tapply.stat
## The following objects are masked from 'package:timeDate':
## 
##     kurtosis, skewness
out<-with(dados2,friedman(m,f, x,alpha=0.05, group=TRUE,console=TRUE,
                         main="Data of the book of Conover"))
## 
## Study: Data of the book of Conover 
## 
## f,  Sum of the ranks
## 
##    x r
## 1  8 4
## 2  7 4
## 3  9 4
## 4 16 4
## 5 20 4
## 
## Friedman's Test
## ===============
## Adjusted for ties
## Critical Value: 13.33333
## P.Value Chisq: 0.009756859
## F Value: 15
## P.Value F: 0.0001286008 
## 
## Post Hoc Analysis
## 
## Alpha: 0.05 ; DF Error: 12
## t-Student: 2.178813
## LSD: 4.535561 
## 
## Treatments with the same letter are not significantly different.
## 
##   Sum of ranks groups
## 5           20      a
## 4           16      a
## 3            9      b
## 1            8      b
## 2            7      b
#startgraph
plot(out,variation="IQR")

Observando o gráfico final de grupos podemos concluir que não existe diferença significativa entre os dois primeiros médicos(4 e 5), porém, os médicos 4 e5 diferem dos demais médicos. Com relação aos três médicos que restaram (1,2 e 3) os 3 alocam um mesmo grupo, ou seja, não existe diferença significativa entre eles. Fazendo agora imagens por médicos temos que

out<-with(dados2,friedman(f,m, x,alpha=0.05, group=TRUE,console=TRUE,
                         main="Data of the book of Conover"))
## 
## Study: Data of the book of Conover 
## 
## m,  Sum of the ranks
## 
##    x r
## A 10 5
## M 20 5
## N  5 5
## P 15 5
## 
## Friedman's Test
## ===============
## Adjusted for ties
## Critical Value: 15
## P.Value Chisq: 0.001816649
## F Value: Inf
## P.Value F: 0 
## 
## Post Hoc Analysis
## 
## Alpha: 0.05 ; DF Error: 12
## t-Student: 2.178813
## LSD: 0 
## 
## Treatments with the same letter are not significantly different.
## 
##   Sum of ranks groups
## M           20      a
## P           15      b
## A           10      c
## N            5      d
#startgraph
plot(out,variation="IQR")

Com relação as imagens que todas diferem significativamente entre si, seguindo a seguinte ordem decrescente: M, P, A, N.

Separando por imagem têremos

imagem.A<-dados[dados$IMAGEM == "A", c(1,4)]
dim(imagem.A)
## [1] 230   2
head(imagem.A)
##    MÉDICO GSM
## 1       1  85
## 5       1  59
## 9       2 106
## 10      2 118
## 17      3  43
## 18      3  72
imagem.M<-dados[dados$IMAGEM =="M", c(1,4)]
dim(imagem.M)
## [1] 229   2
head(imagem.M)
##    MÉDICO GSM
## 4       1  92
## 8       1  98
## 15      2 111
## 16      2  99
## 23      3  84
## 24      3  98
imagem.N<-dados[dados$IMAGEM =="N", c(1,4)]
dim(imagem.N)
## [1] 231   2
head(imagem.N)
##    MÉDICO GSM
## 3       1  63
## 7       1  51
## 13      2 104
## 14      2 107
## 21      3  61
## 22      3  80
imagem.P<-dados[dados$IMAGEM =="P", c(1,4)]
dim(imagem.P)
## [1] 229   2
head(imagem.P)
##    MÉDICO GSM
## 2       1 124
## 6       1 130
## 11      2 113
## 12      2 115
## 19      3 113
## 20      3  89

Após o particionamento, realizou-se o teste de Kruskall-Wallis para verificar qual grupo difere entre si:

imagem.A2<-aggregate(imagem.A$GSM,by = list(f=imagem.A$MÉDICO), FUN = median)
kruskal.test(imagem.A2)
## Warning in kruskal.test.default(imagem.A2): some elements of 'x' are not
## numeric and will be coerced to numeric
## 
##  Kruskal-Wallis rank sum test
## 
## data:  imagem.A2
## Kruskal-Wallis chi-squared = 6.8182, df = 1, p-value = 0.009023
imagem.M2<-aggregate(imagem.M$GSM,by = list(f=imagem.M$MÉDICO), FUN = median)
kruskal.test(imagem.M2)
## Warning in kruskal.test.default(imagem.M2): some elements of 'x' are not
## numeric and will be coerced to numeric
## 
##  Kruskal-Wallis rank sum test
## 
## data:  imagem.M2
## Kruskal-Wallis chi-squared = 6.8598, df = 1, p-value = 0.008816
imagem.N2<-aggregate(imagem.N$GSM,by = list(f=imagem.N$MÉDICO), FUN = median)
kruskal.test(imagem.N2)
## Warning in kruskal.test.default(imagem.N2): some elements of 'x' are not
## numeric and will be coerced to numeric
## 
##  Kruskal-Wallis rank sum test
## 
## data:  imagem.N2
## Kruskal-Wallis chi-squared = 6.8182, df = 1, p-value = 0.009023
imagem.P2<-aggregate(imagem.P$GSM,by = list(f=imagem.P$MÉDICO), FUN = median)
kruskal.test(imagem.P2)
## Warning in kruskal.test.default(imagem.P2): some elements of 'x' are not
## numeric and will be coerced to numeric
## 
##  Kruskal-Wallis rank sum test
## 
## data:  imagem.P2
## Kruskal-Wallis chi-squared = 6.8598, df = 1, p-value = 0.008816
imagem.A$MEDICO <-as.factor(imagem.A$MÉDICO)

MED1_A<-imagem.A[imagem.A$MÉDICO == "1",2]
MED2_A<-imagem.A[imagem.A$MÉDICO == "2",2]
MED3_A<-imagem.A[imagem.A$MÉDICO == "3",2]
MED4_A<-imagem.A[imagem.A$MEDICO == "4",2]
MED5_A<-imagem.A[imagem.A$MEDICO == "5",2]

imagem.M$MEDICO<-as.factor(imagem.M$MÉDICO)

MED1_M<-imagem.M[imagem.M$MÉDICO == "1",2]
MED2_M<-imagem.M[imagem.M$MÉDICO == "2",2]
MED3_M<-imagem.M[imagem.M$MÉDICO == "3",2]
MED4_M<-imagem.M[imagem.M$MÉDICO == "4",2]
MED5_M<-imagem.M[imagem.M$MÉDICO == "5",2]

imagem.N$MEDICO<-as.factor(imagem.N$MÉDICO)


MED1_N<-imagem.N[imagem.N$MÉDICO == "1",2]
MED2_N<-imagem.N[imagem.N$MÉDICO == "2",2]
MED3_N<-imagem.N[imagem.N$MÉDICO == "3",2]
MED4_N<-imagem.N[imagem.N$MÉDICO == "4",2]
MED5_N<-imagem.N[imagem.N$MÉDICO == "5",2]

imagem.P$MEDICO<-as.factor(imagem.P$MÉDICO)

MED1_P<-imagem.P[imagem.P$MÉDICO == "1",2]
MED2_P<-imagem.P[imagem.P$MÉDICO == "2",2]
MED3_P<-imagem.P[imagem.P$MÉDICO == "3",2]
MED4_P<-imagem.P[imagem.P$MÉDICO == "4",2]
MED5_P<-imagem.P[imagem.P$MÉDICO == "5",2]

Diante disso, aplicou-se o teste de Mann-Whitney para verificar qual destes grupos diferem entre si. A realização do teste foi feita em ordem crescente para todas as imagens.Assim, para a imagem A, obteve-se:

wilcox.test(MED1_A,MED2_A, paired = FALSE)
## Warning in wilcox.test.default(MED1_A, MED2_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_A and MED2_A
## W = 1366, p-value = 0.008428
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_A,MED3_A, paired = FALSE)
## Warning in wilcox.test.default(MED1_A, MED3_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_A and MED3_A
## W = 1400.5, p-value = 0.003636
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_A,MED4_A, paired = FALSE)
## Warning in wilcox.test.default(MED1_A, MED4_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_A and MED4_A
## W = 747, p-value = 0.04646
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_A,MED5_A, paired = FALSE)
## Warning in wilcox.test.default(MED1_A, MED5_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_A and MED5_A
## W = 393.5, p-value = 3.661e-07
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_A,MED3_A, paired = FALSE)
## Warning in wilcox.test.default(MED2_A, MED3_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_A and MED3_A
## W = 1103, p-value = 0.994
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_A,MED4_A, paired = FALSE)
## Warning in wilcox.test.default(MED2_A, MED4_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_A and MED4_A
## W = 516, p-value = 2.359e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_A,MED5_A, paired = FALSE)
## Warning in wilcox.test.default(MED2_A, MED5_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_A and MED5_A
## W = 331, p-value = 4.986e-09
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_A,MED4_A, paired = FALSE)
## Warning in wilcox.test.default(MED3_A, MED4_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_A and MED4_A
## W = 450, p-value = 2.102e-06
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_A,MED5_A, paired = FALSE)
## Warning in wilcox.test.default(MED3_A, MED5_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_A and MED5_A
## W = 208, p-value = 1.219e-11
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED4_A,MED5_A, paired = FALSE)
## Warning in wilcox.test.default(MED4_A, MED5_A, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED4_A and MED5_A
## W = 627.5, p-value = 0.0007879
## alternative hypothesis: true location shift is not equal to 0

Usando como críterio o teste de Wilcox, observa-se que apenas os medicos 2 e 3 não diferem siguinificativamente na Imagem A.

Para a imagem M, obteve-se os seguintes valores:

wilcox.test(MED1_M,MED2_M, paired = FALSE)
## Warning in wilcox.test.default(MED1_M, MED2_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_M and MED2_M
## W = 961, p-value = 0.5645
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_M,MED3_M, paired = FALSE)
## Warning in wilcox.test.default(MED1_M, MED3_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_M and MED3_M
## W = 934.5, p-value = 0.4314
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_M,MED4_M, paired = FALSE)
## Warning in wilcox.test.default(MED1_M, MED4_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_M and MED4_M
## W = 416.5, p-value = 4.213e-06
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_M,MED5_M, paired = FALSE)
## Warning in wilcox.test.default(MED1_M, MED5_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_M and MED5_M
## W = 293.5, p-value = 4.127e-09
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_M,MED3_M, paired = FALSE)
## Warning in wilcox.test.default(MED2_M, MED3_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_M and MED3_M
## W = 1108, p-value = 0.9819
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_M,MED4_M, paired = FALSE)
## Warning in wilcox.test.default(MED2_M, MED4_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_M and MED4_M
## W = 536, p-value = 7.719e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_M,MED5_M, paired = FALSE)
## Warning in wilcox.test.default(MED2_M, MED5_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_M and MED5_M
## W = 390, p-value = 6.627e-08
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_M,MED4_M, paired = FALSE)
## Warning in wilcox.test.default(MED3_M, MED4_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_M and MED4_M
## W = 531, p-value = 6.543e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_M,MED5_M, paired = FALSE)
## Warning in wilcox.test.default(MED3_M, MED5_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_M and MED5_M
## W = 386, p-value = 5.597e-08
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED4_M,MED5_M, paired = FALSE)
## Warning in wilcox.test.default(MED4_M, MED5_M, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED4_M and MED5_M
## W = 774, p-value = 0.0392
## alternative hypothesis: true location shift is not equal to 0

Usando como críterio o teste de Wilcox, observa-se que apenas as combinações (1,2), (1,3) e (2,3) para a imagem M não diferem siguinificativamente.

Para a imagem N, obteve-se os seguintes valores:

wilcox.test(MED1_N,MED2_N, paired = FALSE)
## Warning in wilcox.test.default(MED1_N, MED2_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_N and MED2_N
## W = 1345.5, p-value = 0.02458
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_N,MED3_N, paired = FALSE)
## Warning in wilcox.test.default(MED1_N, MED3_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_N and MED3_N
## W = 1251, p-value = 0.1313
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_N,MED4_N, paired = FALSE)
## Warning in wilcox.test.default(MED1_N, MED4_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_N and MED4_N
## W = 843.5, p-value = 0.1736
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_N,MED5_N, paired = FALSE)
## Warning in wilcox.test.default(MED1_N, MED5_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_N and MED5_N
## W = 506.5, p-value = 1.692e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_N,MED3_N, paired = FALSE)
## Warning in wilcox.test.default(MED2_N, MED3_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_N and MED3_N
## W = 1042, p-value = 0.6388
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_N,MED4_N, paired = FALSE)
## Warning in wilcox.test.default(MED2_N, MED4_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_N and MED4_N
## W = 670.5, p-value = 0.002518
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_N,MED5_N, paired = FALSE)
## Warning in wilcox.test.default(MED2_N, MED5_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_N and MED5_N
## W = 408.5, p-value = 1.425e-07
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_N,MED4_N, paired = FALSE)
## Warning in wilcox.test.default(MED3_N, MED4_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_N and MED4_N
## W = 708, p-value = 0.006369
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_N,MED5_N, paired = FALSE)
## Warning in wilcox.test.default(MED3_N, MED5_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_N and MED5_N
## W = 383, p-value = 4.859e-08
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED4_N,MED5_N, paired = FALSE)
## Warning in wilcox.test.default(MED4_N, MED5_N, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED4_N and MED5_N
## W = 721, p-value = 0.008639
## alternative hypothesis: true location shift is not equal to 0

Usando como críterio o teste de Wilcox, observa-se que apenas as combinações (1,3), (1,4) e (2,3) para a imagem N não diferem siguinificativamente.

Por fim, para a imagem P, obteve-se os seguintes valores:

wilcox.test(MED1_P,MED2_P, paired = FALSE)
## Warning in wilcox.test.default(MED1_P, MED2_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_P and MED2_P
## W = 1003.5, p-value = 0.8116
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_P,MED3_P, paired = FALSE)
## Warning in wilcox.test.default(MED1_P, MED3_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_P and MED3_P
## W = 992.5, p-value = 0.7446
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_P,MED4_P, paired = FALSE)
## Warning in wilcox.test.default(MED1_P, MED4_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_P and MED4_P
## W = 441.5, p-value = 1.126e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED1_P,MED5_P, paired = FALSE)
## Warning in wilcox.test.default(MED1_P, MED5_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED1_P and MED5_P
## W = 275, p-value = 1.689e-09
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_P,MED3_P, paired = FALSE)
## Warning in wilcox.test.default(MED2_P, MED3_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_P and MED3_P
## W = 1112, p-value = 0.9578
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_P,MED4_P, paired = FALSE)
## Warning in wilcox.test.default(MED2_P, MED4_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_P and MED4_P
## W = 520.5, p-value = 4.589e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED2_P,MED5_P, paired = FALSE)
## Warning in wilcox.test.default(MED2_P, MED5_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED2_P and MED5_P
## W = 335.5, p-value = 6.152e-09
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_P,MED4_P, paired = FALSE)
## Warning in wilcox.test.default(MED3_P, MED4_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_P and MED4_P
## W = 506.5, p-value = 2.822e-05
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED3_P,MED5_P, paired = FALSE)
## Warning in wilcox.test.default(MED3_P, MED5_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED3_P and MED5_P
## W = 319.5, p-value = 2.964e-09
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(MED4_P,MED5_P, paired = FALSE)
## Warning in wilcox.test.default(MED4_P, MED5_P, paired = FALSE): cannot
## compute exact p-value with ties
## 
##  Wilcoxon rank sum test with continuity correction
## 
## data:  MED4_P and MED5_P
## W = 716.5, p-value = 0.01178
## alternative hypothesis: true location shift is not equal to 0

Usando como críterio o teste de Wilcox, observa-se que apenas as combinações (1,2), (1,3) e (2,3) para a imagem P não diferem siguinificativamente.