library(vcdExtra)
## Warning: package 'vcdExtra' was built under R version 3.4.4
## Loading required package: vcd
## Warning: package 'vcd' was built under R version 3.4.4
## Loading required package: grid
## Loading required package: gnm
## Warning: package 'gnm' was built under R version 3.4.4
data(Abortion)
str(Abortion)
## table [1:2, 1:2, 1:2] 171 152 138 167 79 148 112 133
## - attr(*, "dimnames")=List of 3
## ..$ Sex : chr [1:2] "Female" "Male"
## ..$ Status : chr [1:2] "Lo" "Hi"
## ..$ Support_Abortion: chr [1:2] "Yes" "No"
#B. Do the same for the association of support for abortion with status, stratified by sex.
fourfold(aperm(Abortion,c(3,1,2)))
#C. For each of the problems above, use oddsratio () to calculate the numerical values of the odds ratio, as stratified in the question.
oddsratio(Abortion, log = F)
## odds ratios for Sex and Status by Support_Abortion
##
## Yes No
## 1.3614130 0.6338682
confint(oddsratio(Abortion, log = F))
## 2.5 % 97.5 %
## Yes 0.9945685 1.8635675
## No 0.4373246 0.9187431
Apparently, if the male people in a high status are more likely to support abortion. On the other hand, for female peole, they tend to support abortion if their status is low.
Mdata = matrix(c(24,8,13,45,8,13,11,32,10,9,64,83,42,30,88,160), ncol = 4, byrow = T)
colnames(Mdata) = c("Con", "Mixed", "Pro", "Total")
rownames(Mdata) = c("Con", "Mixed", "Pro", "Total")
Mdata
## Con Mixed Pro Total
## Con 24 8 13 45
## Mixed 8 13 11 32
## Pro 10 9 64 83
## Total 42 30 88 160
Kappa(Mdata)
## value ASE z Pr(>|z|)
## Unweighted 0.09012 0.02882 3.127 0.001767
## Weighted 0.08737 0.03372 2.591 0.009573
agreementplot(Mdata, main = "Portion")
agreementplot(Mdata, main = "disproportion", weights = 1)