Declaração do plano amostral
###################################################################################################
# Reponderação e resultados para a Esratégia 1
# Trazendo dados trabalhados na Reponderação das Estratégias 2 e 3
coleta_4tri<-readRDS(file="W:\\Amostra\\Reponderação\\4_tri\\Resultados_revisados\\SIPS_4tri.rds")
#Trazendo dados populacionais
Pos_estratos <- read.csv("W:\\Amostra\\Reponderação\\4_tri\\Workspace\\vetor_calib.csv", sep=";", dec=",", header=TRUE)
x <- subset(coleta_4tri, pos_estrato == "ServiçosIntermediário")
#Concacentando os Estratos com o Tipo de produto
Pos_estratos$pos_estrato <- paste0(Pos_estratos$Estrato,Pos_estratos$Tipo_produto)
# Vetor segundo IPCA nos 3 estratos
Pos_est1 <- Pos_estratos %>%
select(Pop_Est1,pos_estrato)
# Excluindo industria
Pos_est1 <- subset(Pos_est1,Pop_Est1>0)
coleta_4tri <- subset(coleta_4tri,Estrato != "Industria"& Estrato != "Intermediário")
################################################################################################
# Declarando Plano amostral
plano_SIPS <- svydesign(ids = ~ 1, strata = ~ amostra_dominio, weights = ~peso_dsn,
data = coleta_4tri, nest = TRUE)
#Calibração
calibra2 = postStratify(plano_SIPS, ~pos_estrato, Pos_est1)
# Trazendo o peso para a base de dados
coleta_4tri$peso_est1 <- weights(calibra2)
# Calculando os fatores de ajuste (gweigths)
coleta_4tri$gweights2 <-coleta_4tri$peso_est1/coleta_4tri$peso_dsn
pesos_agregados<-coleta_4tri %>%
select(P1,pos_estrato,peso_est1)
pesos_agregados<-unique(pesos_agregados)
#####################################################################################
# Declarando o plano amostral sob a 2ª calibração
coleta_4tri$pos_estrato <- ifelse(coleta_4tri$pos_estrato == "ServiçosSPF", "Serviços SPF", coleta_4tri$pos_estrato)
pl_est1 <- svydesign(ids = ~ 1, strata = ~ amostra_dominio, weights = ~peso_est1,
data = coleta_4tri, nest = TRUE)
#Total pós estrato
total <- as.data.frame(svyby(~aux,~pos_estrato,pl_est1, svytotal,pps = "TRUE",na.rm = "TRUE"))
#Total estrato
total2 <- as.data.frame(svyby(~aux,~Estrato,pl_est1, svytotal,pps = "TRUE",na.rm = "TRUE"))
rm(total, total2)
Desagregado pro produto (1º Cruzamento)
Alimentação fora do domicílio
probit_cz1_AFD=svyolr(P18_probit~AFD_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_AFD)
## Call:
## svyolr(P18_probit ~ AFD_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## AFD_P4x2 0.3580984 0.5045568 0.7097287
## AFD_P4x3 0.2635348 0.4957977 0.5315369
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.7691 0.5344 -3.3103
## 2|3 0.7421 0.4766 1.5572
## (723 observations deleted due to missingness)
probit_cz1_AFD$deviance+2*length(probit_cz1_AFD$coefficients)
## [1] 206.9094
confint(probit_cz1_AFD)
## 2.5 % 97.5 %
## AFD_P4x2 -0.6308147 1.3470115
## AFD_P4x3 -0.7082109 1.2352805
## 1|2 -2.8165695 -0.7216578
## 2|3 0.5490825 0.9351340
sqrt(probit_cz1_AFD$var[1,1])/probit_cz1_AFD$coefficients[1]
## AFD_P4x2
## 1.408989
sqrt(probit_cz1_AFD$var[2,2])/probit_cz1_AFD$coefficients[2]
## AFD_P4x3
## 1.881337
sqrt(probit_cz1_AFD$var[3,3])/probit_cz1_AFD$zeta[1]
## 1|2
## -0.3020869
sqrt(probit_cz1_AFD$var[2,2])/probit_cz1_AFD$zeta[2]
## 2|3
## 0.6680936
Alimentação no domicílio
probit_cz1_AND=svyolr(P18_probit~AND_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_AND)
## Call:
## svyolr(P18_probit ~ AND_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## AND_P4x2 0.6713886 0.3988157 1.683456
## AND_P4x3 1.0300864 0.3910574 2.634105
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.5664 0.3750 -1.5104
## 2|3 0.9309 0.3805 2.4463
## (675 observations deleted due to missingness)
probit_cz1_AND$deviance+2*length(probit_cz1_AND$coefficients)
## [1] 344.8374
confint(probit_cz1_AND)
## 2.5 % 97.5 %
## AND_P4x2 -0.1102758 1.4530530
## AND_P4x3 0.2636279 1.7965449
## 1|2 -1.3013660 0.1685859
## 2|3 0.7414722 1.1203929
sqrt(probit_cz1_AND$var[1,1])/probit_cz1_AND$coefficients[1]
## AND_P4x2
## 0.5940162
sqrt(probit_cz1_AND$var[2,2])/probit_cz1_AND$coefficients[2]
## AND_P4x3
## 0.3796356
sqrt(probit_cz1_AND$var[3,3])/probit_cz1_AND$zeta[1]
## 1|2
## -0.6620784
sqrt(probit_cz1_AND$var[2,2])/probit_cz1_AND$zeta[2]
## 2|3
## 0.4200707
Comunicação
probit_cz1_COM=svyolr(P18_probit~COM_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_COM)
## Call:
## svyolr(P18_probit ~ COM_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## COM_P4x3 -0.05424239 0.5165205 -0.105015
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.7724 0.4809 -1.6063
## 2|3 1.1683 0.5389 2.1681
## (843 observations deleted due to missingness)
probit_cz1_COM$deviance+2*length(probit_cz1_COM$coefficients)
## [1] 38.27652
confint(probit_cz1_COM)
## 2.5 % 97.5 %
## COM_P4x3 -1.0666040 0.9581192
## 1|2 -1.7148747 0.1700449
## 2|3 0.6902434 1.6463308
sqrt(probit_cz1_COM$var[1,1])/probit_cz1_COM$coefficients[1]
## COM_P4x3
## -9.522452
sqrt(probit_cz1_COM$var[2,2])/probit_cz1_COM$coefficients[2]
## <NA>
## NA
sqrt(probit_cz1_COM$var[3,3])/probit_cz1_COM$zeta[1]
## 1|2
## -0.3157686
sqrt(probit_cz1_COM$var[2,2])/probit_cz1_COM$zeta[2]
## 2|3
## 0.4115903
Despesas pessoais
probit_cz1_DESP=svyolr(P18_probit~DESP_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_DESP)
## Call:
## svyolr(P18_probit ~ DESP_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## DESP_P4x2 0.001244777 0.7573168 0.001643667
## DESP_P4x3 0.347222630 0.7525646 0.461385821
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.6718 0.7267 -2.3006
## 2|3 0.2208 0.7242 0.3049
## (758 observations deleted due to missingness)
probit_cz1_DESP$deviance+2*length(probit_cz1_DESP$coefficients)
## [1] 174.4355
confint(probit_cz1_DESP)
## 2.5 % 97.5 %
## DESP_P4x2 -1.48306891 1.4855585
## DESP_P4x3 -1.12777686 1.8222221
## 1|2 -3.09615556 -0.2475150
## 2|3 -0.01632875 0.4579696
sqrt(probit_cz1_DESP$var[1,1])/probit_cz1_DESP$coefficients[1]
## DESP_P4x2
## 608.3958
sqrt(probit_cz1_DESP$var[2,2])/probit_cz1_DESP$coefficients[2]
## DESP_P4x3
## 2.167383
sqrt(probit_cz1_DESP$var[3,3])/probit_cz1_DESP$zeta[1]
## 1|2
## -0.4346764
sqrt(probit_cz1_DESP$var[2,2])/probit_cz1_DESP$zeta[2]
## 2|3
## 3.408039
Transportes
probit_cz1_TP=svyolr(P18_probit~TP_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_TP)
## Call:
## svyolr(P18_probit ~ TP_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## TP_P4x2 0.1219429 0.3589585 0.339713
## TP_P4x3 0.4552344 0.3494852 1.302586
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.9868 0.3344 -2.9512
## 2|3 0.7075 0.3316 2.1337
## (711 observations deleted due to missingness)
probit_cz1_TP$deviance+2*length(probit_cz1_TP$coefficients)
## [1] 284.8073
confint(probit_cz1_TP)
## 2.5 % 97.5 %
## TP_P4x2 -0.5816028 0.8254886
## TP_P4x3 -0.2297439 1.1402127
## 1|2 -1.6421689 -0.3314350
## 2|3 0.5318988 0.8831130
sqrt(probit_cz1_TP$var[1,1])/probit_cz1_TP$coefficients[1]
## TP_P4x2
## 2.943661
sqrt(probit_cz1_TP$var[2,2])/probit_cz1_TP$coefficients[2]
## TP_P4x3
## 0.7677037
sqrt(probit_cz1_TP$var[3,3])/probit_cz1_TP$zeta[1]
## 1|2
## -0.3388492
sqrt(probit_cz1_TP$var[2,2])/probit_cz1_TP$zeta[2]
## 2|3
## 0.4939679
Vestuários
probit_cz1_VT=svyolr(P18_probit~VT_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_VT)
## Call:
## svyolr(P18_probit ~ VT_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## VT_P4x2 0.1900044 0.4926031 0.3857151
## VT_P4x3 0.6311373 0.4895082 1.2893295
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.3259 0.4866 -2.7250
## 2|3 0.7836 0.4674 1.6766
## (764 observations deleted due to missingness)
probit_cz1_VT$deviance+2*length(probit_cz1_VT$coefficients)
## [1] 163.7974
confint(probit_cz1_VT)
## 2.5 % 97.5 %
## VT_P4x2 -0.7754799 1.1554888
## VT_P4x3 -0.3282811 1.5905556
## 1|2 -2.2796292 -0.3722546
## 2|3 0.5638597 1.0034222
sqrt(probit_cz1_VT$var[1,1])/probit_cz1_VT$coefficients[1]
## VT_P4x2
## 2.592587
sqrt(probit_cz1_VT$var[2,2])/probit_cz1_VT$coefficients[2]
## VT_P4x3
## 0.7755969
sqrt(probit_cz1_VT$var[3,3])/probit_cz1_VT$zeta[1]
## 1|2
## -0.3669724
sqrt(probit_cz1_VT$var[2,2])/probit_cz1_VT$zeta[2]
## 2|3
## 0.6246587
Habitação
probit_cz1_HB=svyolr(P18_probit~HB_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_HB)
## Call:
## svyolr(P18_probit ~ HB_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## HB_P4x2 4.380813 0.5427223 8.071924
## HB_P4x3 4.088078 0.4873771 8.387916
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.4315 0.7496 -0.5757
## 2|3 3.5774 0.2688 13.3069
## (834 observations deleted due to missingness)
probit_cz1_HB$deviance+2*length(probit_cz1_HB$coefficients)
## [1] 39.28696
confint(probit_cz1_HB)
## 2.5 % 97.5 %
## HB_P4x2 3.317097 5.444529
## HB_P4x3 3.132837 5.043320
## 1|2 -1.900680 1.037636
## 2|3 3.286073 3.868676
sqrt(probit_cz1_HB$var[1,1])/probit_cz1_HB$coefficients[1]
## HB_P4x2
## 0.1238862
sqrt(probit_cz1_HB$var[2,2])/probit_cz1_HB$coefficients[2]
## HB_P4x3
## 0.1192191
sqrt(probit_cz1_HB$var[3,3])/probit_cz1_HB$zeta[1]
## 1|2
## -1.737071
sqrt(probit_cz1_HB$var[2,2])/probit_cz1_HB$zeta[2]
## 2|3
## 0.1362388
Demais produtos
probit_cz1_DP=svyolr(P18_probit~DP_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_DP)
## Call:
## svyolr(P18_probit ~ DP_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## DP_P4x3 -0.3823874 0.9199916 -0.4156423
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.0462 0.9300 -1.1248
## 2|3 -0.2730 0.8595 -0.3177
## (848 observations deleted due to missingness)
probit_cz1_DP$deviance+2*length(probit_cz1_DP$coefficients)
## [1] 35.35492
confint(probit_cz1_DP)
## 2.5 % 97.5 %
## DP_P4x3 -2.185538 1.4207630
## 1|2 -2.869002 0.7766912
## 2|3 -1.124738 0.5786721
sqrt(probit_cz1_DP$var[1,1])/probit_cz1_DP$coefficients[1]
## DP_P4x3
## -2.405915
sqrt(probit_cz1_DP$var[2,2])/probit_cz1_DP$coefficients[2]
## <NA>
## NA
sqrt(probit_cz1_DP$var[3,3])/probit_cz1_DP$zeta[1]
## 1|2
## -0.4153793
sqrt(probit_cz1_DP$var[2,2])/probit_cz1_DP$zeta[2]
## 2|3
## -3.406334
Cuidados pessoais
probit_cz1_CP=svyolr(P18_probit~CP_P4x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz1_CP)
## Call:
## svyolr(P18_probit ~ CP_P4x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## CP_P4x2 -0.4437260 0.5824314 -0.7618511
## CP_P4x3 0.1775996 0.6059185 0.2931080
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.5265 0.5574 -2.7386
## 2|3 0.2593 0.5509 0.4707
## (819 observations deleted due to missingness)
probit_cz1_CP$deviance+2*length(probit_cz1_CP$coefficients)
## [1] 82.73779
confint(probit_cz1_CP)
## 2.5 % 97.5 %
## CP_P4x2 -1.58527068 0.6978186
## CP_P4x3 -1.00997890 1.3651781
## 1|2 -2.61903430 -0.4340438
## 2|3 -0.07530876 0.5939040
sqrt(probit_cz1_CP$var[1,1])/probit_cz1_CP$coefficients[1]
## CP_P4x2
## -1.312592
sqrt(probit_cz1_CP$var[2,2])/probit_cz1_CP$coefficients[2]
## CP_P4x3
## 3.411711
sqrt(probit_cz1_CP$var[3,3])/probit_cz1_CP$zeta[1]
## 1|2
## -0.3651435
sqrt(probit_cz1_CP$var[2,2])/probit_cz1_CP$zeta[2]
## 2|3
## 2.336769
Desagregado pro produto (2º Cruzamento)
Alimentação fora do domicílio
probit_cz2_AFD=svyolr(P18_probit~AFD_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_AFD)
## Call:
## svyolr(P18_probit ~ AFD_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## AFD_P10x2 0.8222352 0.6597966 1.246195
## AFD_P10x3 0.8439980 0.6588212 1.281073
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.2807 0.6489 -1.9738
## 2|3 1.2794 0.6488 1.9720
## (722 observations deleted due to missingness)
probit_cz2_AFD$deviance+2*length(probit_cz2_AFD$coefficients)
## [1] 205.8522
confint(probit_cz2_AFD)
## 2.5 % 97.5 %
## AFD_P10x2 -0.4709424 2.115412751
## AFD_P10x3 -0.4472677 2.135263816
## 1|2 -2.5524084 -0.008958398
## 2|3 1.0822051 1.476581251
sqrt(probit_cz2_AFD$var[1,1])/probit_cz2_AFD$coefficients[1]
## AFD_P10x2
## 0.8024427
sqrt(probit_cz2_AFD$var[2,2])/probit_cz2_AFD$coefficients[2]
## AFD_P10x3
## 0.7805956
sqrt(probit_cz2_AFD$var[3,3])/probit_cz2_AFD$zeta[1]
## 1|2
## -0.5066445
sqrt(probit_cz2_AFD$var[2,2])/probit_cz2_AFD$zeta[2]
## 2|3
## 0.5149482
Alimentação no domicílio
probit_cz2_AND=svyolr(P18_probit~AND_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_AND)
## Call:
## svyolr(P18_probit ~ AND_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## AND_P10x2 -0.5697483 0.6759124 -0.8429322
## AND_P10x3 -0.5909782 0.6737656 -0.8771273
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.9143 0.6704 -2.8553
## 2|3 -0.4955 0.6648 -0.7453
## (675 observations deleted due to missingness)
probit_cz2_AND$deviance+2*length(probit_cz2_AND$coefficients)
## [1] 356.1247
confint(probit_cz2_AND)
## 2.5 % 97.5 %
## AND_P10x2 -1.8945123 0.7550157
## AND_P10x3 -1.9115345 0.7295781
## 1|2 -3.2282730 -0.6002351
## 2|3 -0.6863038 -0.3046395
sqrt(probit_cz2_AND$var[1,1])/probit_cz2_AND$coefficients[1]
## AND_P10x2
## -1.186335
sqrt(probit_cz2_AND$var[2,2])/probit_cz2_AND$coefficients[2]
## AND_P10x3
## -1.140085
sqrt(probit_cz2_AND$var[3,3])/probit_cz2_AND$zeta[1]
## 1|2
## -0.3502305
sqrt(probit_cz2_AND$var[2,2])/probit_cz2_AND$zeta[2]
## 2|3
## -1.359847
Comunicação
probit_cz2_DESP=svyolr(P18_probit~DESP_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_DESP)
## Call:
## svyolr(P18_probit ~ DESP_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## DESP_P10x2 -1.844616 0.6566513 -2.809125
## DESP_P10x3 -1.079393 0.6487322 -1.663850
##
## Intercepts:
## Value Std. Error t value
## 1|2 -3.2883 0.6533 -5.0338
## 2|3 -1.2574 0.6057 -2.0759
## (759 observations deleted due to missingness)
probit_cz2_DESP$deviance+2*length(probit_cz2_DESP$coefficients)
## [1] 161.3548
confint(probit_cz2_DESP)
## 2.5 % 97.5 %
## DESP_P10x2 -3.131629 -0.5576030
## DESP_P10x3 -2.350885 0.1920989
## 1|2 -4.568690 -2.0079762
## 2|3 -1.505941 -1.0088740
sqrt(probit_cz2_DESP$var[1,1])/probit_cz2_DESP$coefficients[1]
## DESP_P10x2
## -0.3559827
sqrt(probit_cz2_DESP$var[2,2])/probit_cz2_DESP$coefficients[2]
## DESP_P10x3
## -0.6010159
sqrt(probit_cz2_DESP$var[3,3])/probit_cz2_DESP$zeta[1]
## 1|2
## -0.1986585
sqrt(probit_cz2_DESP$var[2,2])/probit_cz2_DESP$zeta[2]
## 2|3
## -0.5159284
Despesas pessoais
probit_cz2_DESP=svyolr(P18_probit~DESP_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_DESP)
## Call:
## svyolr(P18_probit ~ DESP_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## DESP_P10x2 -1.844616 0.6566513 -2.809125
## DESP_P10x3 -1.079393 0.6487322 -1.663850
##
## Intercepts:
## Value Std. Error t value
## 1|2 -3.2883 0.6533 -5.0338
## 2|3 -1.2574 0.6057 -2.0759
## (759 observations deleted due to missingness)
probit_cz2_DESP$deviance+2*length(probit_cz2_DESP$coefficients)
## [1] 161.3548
confint(probit_cz2_DESP)
## 2.5 % 97.5 %
## DESP_P10x2 -3.131629 -0.5576030
## DESP_P10x3 -2.350885 0.1920989
## 1|2 -4.568690 -2.0079762
## 2|3 -1.505941 -1.0088740
sqrt(probit_cz2_DESP$var[1,1])/probit_cz2_DESP$coefficients[1]
## DESP_P10x2
## -0.3559827
sqrt(probit_cz2_DESP$var[2,2])/probit_cz2_DESP$coefficients[2]
## DESP_P10x3
## -0.6010159
sqrt(probit_cz2_DESP$var[3,3])/probit_cz2_DESP$zeta[1]
## 1|2
## -0.1986585
sqrt(probit_cz2_DESP$var[2,2])/probit_cz2_DESP$zeta[2]
## 2|3
## -0.5159284
Transportes
probit_cz2_TP=svyolr(P18_probit~TP_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_TP)
## Call:
## svyolr(P18_probit ~ TP_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## TP_P10x2 0.7350751 0.3793223 1.937864
## TP_P10x3 1.0767344 0.3768196 2.857426
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.4197 0.3528 -1.1897
## 2|3 1.3094 0.3605 3.6327
## (711 observations deleted due to missingness)
probit_cz2_TP$deviance+2*length(probit_cz2_TP$coefficients)
## [1] 280.2148
confint(probit_cz2_TP)
## 2.5 % 97.5 %
## TP_P10x2 -0.008382906 1.4785331
## TP_P10x3 0.338181428 1.8152873
## 1|2 -1.111221784 0.2717688
## 2|3 1.131106486 1.4877805
sqrt(probit_cz2_TP$var[1,1])/probit_cz2_TP$coefficients[1]
## TP_P10x2
## 0.516032
sqrt(probit_cz2_TP$var[2,2])/probit_cz2_TP$coefficients[2]
## TP_P10x3
## 0.3499653
sqrt(probit_cz2_TP$var[3,3])/probit_cz2_TP$zeta[1]
## 1|2
## -0.8405716
sqrt(probit_cz2_TP$var[2,2])/probit_cz2_TP$zeta[2]
## 2|3
## 0.2877708
Vestuários
probit_cz2_VT=svyolr(P18_probit~VT_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_VT)
## Call:
## svyolr(P18_probit ~ VT_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## VT_P10x2 0.2940697 0.6073949 0.4841491
## VT_P10x3 0.3902644 0.5983578 0.6522259
##
## Intercepts:
## Value Std. Error t value
## 1|2 -1.3479 0.6081 -2.2164
## 2|3 0.6707 0.5803 1.1558
## (767 observations deleted due to missingness)
probit_cz2_VT$deviance+2*length(probit_cz2_VT$coefficients)
## [1] 164.1365
confint(probit_cz2_VT)
## 2.5 % 97.5 %
## VT_P10x2 -0.8964024 1.4845417
## VT_P10x3 -0.7824953 1.5630242
## 1|2 -2.5398340 -0.1559702
## 2|3 0.4531406 0.8882971
sqrt(probit_cz2_VT$var[1,1])/probit_cz2_VT$coefficients[1]
## VT_P10x2
## 2.065479
sqrt(probit_cz2_VT$var[2,2])/probit_cz2_VT$coefficients[2]
## VT_P10x3
## 1.533211
sqrt(probit_cz2_VT$var[3,3])/probit_cz2_VT$zeta[1]
## 1|2
## -0.451175
sqrt(probit_cz2_VT$var[2,2])/probit_cz2_VT$zeta[2]
## 2|3
## 0.8921142
Habitação
probit_cz2_HB=svyolr(P18_probit~HB_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_HB)
## Call:
## svyolr(P18_probit ~ HB_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## HB_P10x2 -2.692304 0.4557170 -5.907843
## HB_P10x3 -3.865608 0.6749546 -5.727212
##
## Intercepts:
## Value Std. Error t value
## 1|2 -5.6976 0.7580 -7.5168
## 2|3 -3.8677 0.2585 -14.9599
## (834 observations deleted due to missingness)
probit_cz2_HB$deviance+2*length(probit_cz2_HB$coefficients)
## [1] 39.99542
confint(probit_cz2_HB)
## 2.5 % 97.5 %
## HB_P10x2 -3.585493 -1.799115
## HB_P10x3 -5.188495 -2.542722
## 1|2 -7.183190 -4.211955
## 2|3 -4.630576 -3.104786
sqrt(probit_cz2_HB$var[1,1])/probit_cz2_HB$coefficients[1]
## HB_P10x2
## -0.1692665
sqrt(probit_cz2_HB$var[2,2])/probit_cz2_HB$coefficients[2]
## HB_P10x3
## -0.174605
sqrt(probit_cz2_HB$var[3,3])/probit_cz2_HB$zeta[1]
## 1|2
## -0.1330359
sqrt(probit_cz2_HB$var[2,2])/probit_cz2_HB$zeta[2]
## 2|3
## -0.1745114
Demais produtos
probit_cz2_DP=svyolr(P18_probit~DP_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_DP)
## Call:
## svyolr(P18_probit ~ DP_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## DP_P10x2 0.3186903 0.4089470 0.7792949
## DP_P10x3 0.4150695 0.4913974 0.8446717
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.3861 0.1678 -2.3015
## 2|3 0.3861 0.1678 2.3013
## (848 observations deleted due to missingness)
probit_cz2_DP$deviance+2*length(probit_cz2_DP$coefficients)
## [1] 37.40556
confint(probit_cz2_DP)
## 2.5 % 97.5 %
## DP_P10x2 -0.4828311 1.12021172
## DP_P10x3 -0.5480518 1.37819076
## 1|2 -0.7149642 -0.05729533
## 2|3 -0.4655386 1.23776652
sqrt(probit_cz2_DP$var[1,1])/probit_cz2_DP$coefficients[1]
## DP_P10x2
## 1.283211
sqrt(probit_cz2_DP$var[2,2])/probit_cz2_DP$coefficients[2]
## DP_P10x3
## 1.183892
sqrt(probit_cz2_DP$var[3,3])/probit_cz2_DP$zeta[1]
## 1|2
## -0.4345061
sqrt(probit_cz2_DP$var[2,2])/probit_cz2_DP$zeta[2]
## 2|3
## 1.272675
Cuidados pessoais
probit_cz2_CP=svyolr(P18_probit~CP_P10x, design = pl_est1,method="probit",na.action = na.omit)
summary(probit_cz2_CP)
## Call:
## svyolr(P18_probit ~ CP_P10x, design = pl_est1, method = "probit",
## na.action = na.omit)
##
## Coefficients:
## Value Std. Error t value
## CP_P10x2 0.5309892 0.1676434 3.167373
## CP_P10x3 0.4606197 0.3339107 1.379470
##
## Intercepts:
## Value Std. Error t value
## 1|2 -0.8603 0.1408 -6.1125
## 2|3 0.8656 0.1405 6.1623
## (819 observations deleted due to missingness)
probit_cz2_CP$deviance+2*length(probit_cz2_CP$coefficients)
## [1] 85.63436
confint(probit_cz2_CP)
## 2.5 % 97.5 %
## CP_P10x2 0.2024141 0.8595642
## CP_P10x3 -0.1938333 1.1150726
## 1|2 -1.1362103 -0.5844762
## 2|3 0.5462602 1.1848504
sqrt(probit_cz2_CP$var[1,1])/probit_cz2_CP$coefficients[1]
## CP_P10x2
## 0.3157191
sqrt(probit_cz2_CP$var[2,2])/probit_cz2_CP$coefficients[2]
## CP_P10x3
## 0.7249163
sqrt(probit_cz2_CP$var[3,3])/probit_cz2_CP$zeta[1]
## 1|2
## -0.1635988
sqrt(probit_cz2_CP$var[2,2])/probit_cz2_CP$zeta[2]
## 2|3
## 0.3857763