Calculo de valores p para la prevalencia de erodentina segun diferentes factores de riesgo


# load('~/Dropbox/odontologia/maestria licet/octubre
# 2013/datos_licet_13102013.RData')
load("C:/Users/usuario/Dropbox/odontologia/maestria licet/octubre 2013/datos_licet_16102013.RData")



library(survey)
## Attaching package: 'survey'
## The following object(s) are masked from 'package:graphics':
## 
## dotchart
options(OutDec = ",")
library(car)
## Loading required package: MASS
## Loading required package: nnet
#
# diseniopost1$variables$erodentina1<-recode(diseniopost1$variables$erodentina,'88=NA')
# diseniopost1$variables$erodentina2<-recode(diseniopost1$variables$erodentina,'88=NA')
# diseniopost1$variables$erodentina1<-as.factor(diseniopost1$variables$erodentina1)
# diseniopost1.sub<-subset(diseniopost1,diseniopost1$variables$filtro==1)


summary(diseniopost1.sub$variables$erodentina1)
##    0    1    2    3    4    6    7 NA's 
## 1086   22   17    3    6    1    1   18
summary(diseniopost1.sub$variables$erodentina2)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max.    NA's 
##    0,00    0,00    0,00    0,09    0,00    7,00      18

summary(diseniopost1$variables[, 432:455])
##  Sexo.rec  Nivel.Socieconomico.rec       Nivel.Educativo.de.la.Madre1.rec
##  1-F:603   1-BAJO :572             1-Incomplete Education: 91            
##  2-M:551   2-MEDIO:285             2-Basic               :683            
##            3-ALTO :281             3-Medium              :201            
##            NA's   : 16             4-High                :137            
##                                    NA's                  : 42            
##                                                                          
##                                                                          
##  Tipo.de.Escuela.rec                FrCepDenti.rec UsoDentifrico3.rec
##  1-Public :220       1-1 vez al dia o menos:238    1-Yes:1119        
##  2-Private:934       2- 2 veces al dia     :377    2-No :  25        
##                      3-3 o mas veces al dia:496    NA's :  10        
##                      NA's                  : 43                      
##                                                                      
##                                                                      
##                                                                      
##  Consitencia_Cepillo.rec                  IGS.rec   
##  1-Soft  :227            1-Mas de 60          : 92  
##  2-Medium:552            2-De 45 a 60         :134  
##  3-Hard  :183            3 -Menos o igual a 45:928  
##  NA's    :192                                       
##                                                     
##                                                     
##                                                     
##            RefrColalight.rec                 JugFrutas.rec
##  2-Todos los dias   :555     1-Nunca o raramente    : 48  
##  3-Nunca o raramente:544     2-Todos los dias       :889  
##  Mas de 3 veces     : 38     3-Mas de 3 veces al dia:204  
##  NA's               : 17     NA's                   : 13  
##                                                           
##                                                           
##                                                           
##           Bebidas_energizantes.rec                   Yogurt.rec 
##  1-Nunca o raramente  :665         1-Mas de 3 veces al dia: 44  
##  2-Todos los dias     :434         2-Todos los dias       :784  
##  Mas de 3 veces al dia: 13         3-Nunca o raramente    :299  
##  NA's                 : 42         NA's                   : 27  
##                                                                 
##                                                                 
##                                                                 
##  Bruxismo.rec BuchTragar.rec       FormBeber.rec AlterGastrica.rec
##  1-No :954    1-No :839      1-Con sorbete: 80   1-No :1062       
##  2-Yes:164    2-Yes:129      2-Por el pico:164   2-Yes:  63       
##  NA's : 36    NA's :186      3-Con vaso   :902   NA's :  29       
##                              NA's         :  8                    
##                                                                   
##                                                                   
##                                                                   
##  MedResp.rec Natac2vec.rec bedeportediario.rec
##  1-No :959   1-No :808     1-Water   :806     
##  2-Yes:170   2-Yes:182     2-Gatorade:126     
##  NA's : 25   NA's :164     3-other   : 42     
##                            NA's      :180     
##                                               
##                                               
##                                               
##                   RefrCola.rec     Nive.Educativo.de.la.Madre2.rec
##  1-Nunca o raramente    :141   1-ELEMENTARY SCHOOL :326           
##  2-Todos los dias       :720   2-HIGH SCHOOL       :577           
##  3-Mas de 3 veces al dia:280   3-COLLEGE-UNIVERSITY:209           
##  NA's                   : 13   NA's                : 42           
##                                                                   
##                                                                   
##                                                                   
##      filtro       erodentina1    erodentina2  
##  Min.   :0,000   0      :1086   Min.   :0,00  
##  1st Qu.:0,000   1      :  22   1st Qu.:0,00  
##  Median :0,000   2      :  17   Median :0,00  
##  Mean   :0,044   4      :   6   Mean   :0,09  
##  3rd Qu.:0,000   3      :   3   3rd Qu.:0,00  
##  Max.   :1,000   (Other):   2   Max.   :7,00  
##  NA's   :18      NA's   :  18   NA's   :18

svychisq(~Sexo.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Sexo.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 3,803, ndf = 1, ddf = 39, p-value = 0,05839

svychisq(~Nivel.Socieconomico.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Nivel.Socieconomico.rec + erodentina.rec, diseniopost1,      statistic = "Wald") 
## F = 0,4384, ndf = 2, ddf = 39, p-value = 0,6482

svychisq(~Nivel.Educativo.de.la.Madre1.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Nivel.Educativo.de.la.Madre1.rec + erodentina.rec,      diseniopost1, statistic = "Wald") 
## F = 0,764, ndf = 3, ddf = 39, p-value = 0,5212

svychisq(~Tipo.de.Escuela.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Tipo.de.Escuela.rec + erodentina.rec, diseniopost1,      statistic = "Wald") 
## F = 2,956, ndf = 1, ddf = 39, p-value = 0,0935

svychisq(~FrCepDenti.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~FrCepDenti.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 0,2154, ndf = 2, ddf = 39, p-value = 0,8071

svychisq(~UsoDentifrico3.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~UsoDentifrico3.rec + erodentina.rec, diseniopost1,      statistic = "Wald") 
## F = 0,0535, ndf = 1, ddf = 39, p-value = 0,8183

diseniopost1$variables$Consitencia_Cepillo.rec <- recode(diseniopost1$variables$Consitencia_Cepillo.rec, 
    "1='3-Hard';3='2-Medium';2='1-Soft'")

svychisq(~Consitencia_Cepillo.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Consitencia_Cepillo.rec + erodentina.rec, diseniopost1,      statistic = "Wald") 
## F = 6,206, ndf = 2, ddf = 39, p-value = 0,00457

svychisq(~IGS.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~IGS.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 5,96, ndf = 2, ddf = 39, p-value = 0,005512


svychisq(~RefrCola.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~RefrCola.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 1,158, ndf = 2, ddf = 39, p-value = 0,3246

svychisq(~JugFrutas.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~JugFrutas.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 1,772, ndf = 2, ddf = 39, p-value = 0,1834

svychisq(~Bebidas_energizantes_b + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Bebidas_energizantes_b + erodentina.rec, diseniopost1,      statistic = "Wald") 
## F = 0,029, ndf = 1, ddf = 39, p-value = 0,8657

svychisq(~Yogurt_b + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Yogurt_b + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 0,4559, ndf = 1, ddf = 39, p-value = 0,5035

svychisq(~Bruxismo.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Bruxismo.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 0,1477, ndf = 1, ddf = 39, p-value = 0,7029

svychisq(~bedeportediario.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~bedeportediario.rec + erodentina.rec, diseniopost1,      statistic = "Wald") 
## F = 2,581, ndf = 2, ddf = 39, p-value = 0,08855

svychisq(~BuchTragar.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~BuchTragar.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 2,705, ndf = 1, ddf = 39, p-value = 0,1081

svychisq(~FormBeber.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~FormBeber.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 0,6092, ndf = 2, ddf = 39, p-value = 0,5489


svychisq(~Natac2vec.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~Natac2vec.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 0,0617, ndf = 1, ddf = 39, p-value = 0,8051

svychisq(~MedResp.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~MedResp.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 1,163, ndf = 1, ddf = 39, p-value = 0,2876

svychisq(~AlterGastrica.rec + erodentina.rec, diseniopost1, statistic = "Wald")
## 
##  Design-based Wald test of association
## 
## data:  svychisq(~AlterGastrica.rec + erodentina.rec, diseniopost1, statistic = "Wald") 
## F = 26,31, ndf = 1, ddf = 39, p-value = 8,311e-06