load("C:/project/AMS_lely/result/graph/paper_3/transmission_risk/method_2/20191106.RData")
library(ggplot2)
for(i in unique(dt_200$farm_id_1)){


x0 <- as.data.frame(prop.table(table(dt_200$scc_diff_0[which(dt_200$farm_id_1==i)], 
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x0$day <- 0
                                     
x1 <- as.data.frame(prop.table(table(dt_200$scc_diff_1[which(dt_200$farm_id_1==i)],                                                                        dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x1$day <- 1
                                     
x2 <- as.data.frame(prop.table(table(dt_200$scc_diff_2[which(dt_200$farm_id_1==i)],
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x2$day <- 2
                                     
x3 <- as.data.frame(prop.table(table(dt_200$scc_diff_3[which(dt_200$farm_id_1==i)],
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x3$day <- 3
                                     
x4 <- as.data.frame(prop.table(table(dt_200$scc_diff_4[which(dt_200$farm_id_1==i)],
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x4$day <- 4
                                     
x5 <- as.data.frame(prop.table(table(dt_200$scc_diff_5[which(dt_200$farm_id_1==i)],
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x5$day <- 5
                                     
x6 <- as.data.frame(prop.table(table(dt_200$scc_diff_6[which(dt_200$farm_id_1==i)],
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x6$day <- 6
                                     
x7 <- as.data.frame(prop.table(table(dt_200$scc_diff_7[which(dt_200$farm_id_1==i)],
                                     dt_200$exposure[which(dt_200$farm_id_1==i)]),2)); x7$day <- 7
                                     
                                     x100 <- rbind(x0,x1,x2,x3,x4,x5,x6,x7)
                                     names(x100) <- c("Differences", "Exposure", "value", "day")
                                     x100$Exposure <- ifelse(x100$Exposure == "exposure", "Yes", "No")
                                     x100$Differences <- factor(x100$Differences, levels =c("NOT incresed  higher than cutoff", "incresed higher than cutoff"))
                                     x100$farm_id <- i
                                     p <- ggplot(x100, aes(Exposure,value,  fill= Differences, label=round(value*100,1))) + geom_bar(stat="identity", width = 0.7) +
                                             facet_grid(.~day)+
                                             geom_text(size=2.5)+
                                             scale_fill_manual(values = c("steelblue", "red")) +
                                             labs(title = i)
                                     print(p)
                                     
                                     
                                     print(i);print(0); print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T)); print(table(dt_200$scc_diff_0[which(dt_200$farm_id_1==i)], 
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i);print(1); print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T)); print(table(dt_200$scc_diff_1[which(dt_200$farm_id_1==i)], 
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i); print(2);print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T)); print(table(dt_200$scc_diff_2[which(dt_200$farm_id_1==i)], 
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i); print(3);print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T));
                                     print(table(dt_200$scc_diff_3[which(dt_200$farm_id_1==i)], 
                                                 dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i); print(4);print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T)); print(table(dt_200$scc_diff_4[which(dt_200$farm_id_1==i)],
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i);print(5);print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T));  print(table(dt_200$scc_diff_5[which(dt_200$farm_id_1==i)], 
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i); print(6);print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T)); print(table(dt_200$scc_diff_6[which(dt_200$farm_id_1==i)], 
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
                                     
                                     print(i); print(7);print(mean(dt_200$mean_scc_whole[which(dt_200$farm_id_1==i)], na.rm = T)); print(table(dt_200$scc_diff_7[which(dt_200$farm_id_1==i)], 
                                                                                                                                               dt_200$exposure[which(dt_200$farm_id_1==i)]))
}

## [1] "DE_01"
## [1] 0
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1           4
##   NOT incresed  higher than cutoff        7         394
## [1] "DE_01"
## [1] 1
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           9
##   NOT incresed  higher than cutoff        8         389
## [1] "DE_01"
## [1] 2
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          13
##   NOT incresed  higher than cutoff        8         385
## [1] "DE_01"
## [1] 3
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          14
##   NOT incresed  higher than cutoff        8         384
## [1] "DE_01"
## [1] 4
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          18
##   NOT incresed  higher than cutoff        8         380
## [1] "DE_01"
## [1] 5
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          24
##   NOT incresed  higher than cutoff        8         374
## [1] "DE_01"
## [1] 6
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          28
##   NOT incresed  higher than cutoff        8         370
## [1] "DE_01"
## [1] 7
## [1] 156.0463
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          36
##   NOT incresed  higher than cutoff        7         362

## [1] "DE_02"
## [1] 0
## [1] 150.5294
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_02"
## [1] 1
## [1] 150.5294
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_02"
## [1] 2
## [1] 150.5294
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2
## [1] "DE_02"
## [1] 3
## [1] 150.5294
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2
## [1] "DE_02"
## [1] 4
## [1] 150.5294
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_02"
## [1] 5
## [1] 150.5294
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_02"
## [1] 6
## [1] 150.5294
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2
## [1] "DE_02"
## [1] 7
## [1] 150.5294
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2

## [1] "DE_06"
## [1] 0
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             9         127
##   NOT incresed  higher than cutoff      366       21004
## [1] "DE_06"
## [1] 1
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             5         218
##   NOT incresed  higher than cutoff      370       20913
## [1] "DE_06"
## [1] 2
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             9         263
##   NOT incresed  higher than cutoff      366       20868
## [1] "DE_06"
## [1] 3
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             8         304
##   NOT incresed  higher than cutoff      367       20827
## [1] "DE_06"
## [1] 4
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             6         339
##   NOT incresed  higher than cutoff      369       20792
## [1] "DE_06"
## [1] 5
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff            11         355
##   NOT incresed  higher than cutoff      364       20776
## [1] "DE_06"
## [1] 6
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             8         384
##   NOT incresed  higher than cutoff      367       20747
## [1] "DE_06"
## [1] 7
## [1] 93.2175
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff            10         396
##   NOT incresed  higher than cutoff      365       20735

## [1] "DE_07"
## [1] 0
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 1
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 2
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 3
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 4
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 5
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 6
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6
## [1] "DE_07"
## [1] 7
## [1] 71.81792
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           6

## [1] "DE_08"
## [1] 0
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             5         207
##   NOT incresed  higher than cutoff      242       15396
## [1] "DE_08"
## [1] 1
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         300
##   NOT incresed  higher than cutoff      245       15303
## [1] "DE_08"
## [1] 2
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             4         308
##   NOT incresed  higher than cutoff      243       15295
## [1] "DE_08"
## [1] 3
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         333
##   NOT incresed  higher than cutoff      244       15270
## [1] "DE_08"
## [1] 4
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         354
##   NOT incresed  higher than cutoff      244       15249
## [1] "DE_08"
## [1] 5
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         356
##   NOT incresed  higher than cutoff      244       15247
## [1] "DE_08"
## [1] 6
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         380
##   NOT incresed  higher than cutoff      244       15223
## [1] "DE_08"
## [1] 7
## [1] 100.6784
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             6         387
##   NOT incresed  higher than cutoff      241       15216

## [1] "DE_09"
## [1] 0
## [1] 356.554
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2
## [1] "DE_09"
## [1] 1
## [1] 356.554
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_09"
## [1] 2
## [1] 356.554
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_09"
## [1] 3
## [1] 356.554
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_09"
## [1] 4
## [1] 356.554
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           1
## [1] "DE_09"
## [1] 5
## [1] 356.554
##                              
##                               no exposure
##   incresed higher than cutoff           2
## [1] "DE_09"
## [1] 6
## [1] 356.554
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2
## [1] "DE_09"
## [1] 7
## [1] 356.554
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           2

## [1] "DE_13"
## [1] 0
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          28
##   NOT incresed  higher than cutoff       18        1941
## [1] "DE_13"
## [1] 1
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          59
##   NOT incresed  higher than cutoff       18        1910
## [1] "DE_13"
## [1] 2
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          62
##   NOT incresed  higher than cutoff       18        1907
## [1] "DE_13"
## [1] 3
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          58
##   NOT incresed  higher than cutoff       18        1911
## [1] "DE_13"
## [1] 4
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          56
##   NOT incresed  higher than cutoff       17        1913
## [1] "DE_13"
## [1] 5
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          66
##   NOT incresed  higher than cutoff       18        1903
## [1] "DE_13"
## [1] 6
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          61
##   NOT incresed  higher than cutoff       17        1908
## [1] "DE_13"
## [1] 7
## [1] 88.92262
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          62
##   NOT incresed  higher than cutoff       17        1907

## [1] "DE_17"
## [1] 0
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           3
##   NOT incresed  higher than cutoff       10         666
## [1] "DE_17"
## [1] 1
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           7
##   NOT incresed  higher than cutoff       10         662
## [1] "DE_17"
## [1] 2
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           9
##   NOT incresed  higher than cutoff       10         660
## [1] "DE_17"
## [1] 3
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          11
##   NOT incresed  higher than cutoff       10         658
## [1] "DE_17"
## [1] 4
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          15
##   NOT incresed  higher than cutoff       10         654
## [1] "DE_17"
## [1] 5
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          15
##   NOT incresed  higher than cutoff       10         654
## [1] "DE_17"
## [1] 6
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          22
##   NOT incresed  higher than cutoff       10         647
## [1] "DE_17"
## [1] 7
## [1] 123.3622
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          21
##   NOT incresed  higher than cutoff       10         648

## [1] "DE_19"
## [1] 0
## [1] 140.6189
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           3
## [1] "DE_19"
## [1] 1
## [1] 140.6189
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           3
## [1] "DE_19"
## [1] 2
## [1] 140.6189
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           3
## [1] "DE_19"
## [1] 3
## [1] 140.6189
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "DE_19"
## [1] 4
## [1] 140.6189
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "DE_19"
## [1] 5
## [1] 140.6189
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           3
## [1] "DE_19"
## [1] 6
## [1] 140.6189
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           3
## [1] "DE_19"
## [1] 7
## [1] 140.6189
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2

## [1] "DK_04"
## [1] 0
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          36
##   NOT incresed  higher than cutoff       19        1432
## [1] "DK_04"
## [1] 1
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2          75
##   NOT incresed  higher than cutoff       18        1393
## [1] "DK_04"
## [1] 2
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2          88
##   NOT incresed  higher than cutoff       18        1380
## [1] "DK_04"
## [1] 3
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          88
##   NOT incresed  higher than cutoff       19        1380
## [1] "DK_04"
## [1] 4
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          94
##   NOT incresed  higher than cutoff       20        1374
## [1] "DK_04"
## [1] 5
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          92
##   NOT incresed  higher than cutoff       20        1376
## [1] "DK_04"
## [1] 6
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0         109
##   NOT incresed  higher than cutoff       20        1359
## [1] "DK_04"
## [1] 7
## [1] 98.63824
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         111
##   NOT incresed  higher than cutoff       18        1357

## [1] "FI_01"
## [1] 0
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2          42
##   NOT incresed  higher than cutoff      134        6193
## [1] "FI_01"
## [1] 1
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          67
##   NOT incresed  higher than cutoff      135        6168
## [1] "FI_01"
## [1] 2
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2          77
##   NOT incresed  higher than cutoff      134        6158
## [1] "FI_01"
## [1] 3
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          84
##   NOT incresed  higher than cutoff      135        6151
## [1] "FI_01"
## [1] 4
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          94
##   NOT incresed  higher than cutoff      135        6141
## [1] "FI_01"
## [1] 5
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         102
##   NOT incresed  higher than cutoff      133        6133
## [1] "FI_01"
## [1] 6
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             4         102
##   NOT incresed  higher than cutoff      132        6133
## [1] "FI_01"
## [1] 7
## [1] 96.68139
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         107
##   NOT incresed  higher than cutoff      134        6128

## [1] "FR_01"
## [1] 0
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             6          61
##   NOT incresed  higher than cutoff       82        4406
## [1] "FR_01"
## [1] 1
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          98
##   NOT incresed  higher than cutoff       87        4369
## [1] "FR_01"
## [1] 2
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         119
##   NOT incresed  higher than cutoff       85        4348
## [1] "FR_01"
## [1] 3
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         131
##   NOT incresed  higher than cutoff       86        4336
## [1] "FR_01"
## [1] 4
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             4         150
##   NOT incresed  higher than cutoff       84        4317
## [1] "FR_01"
## [1] 5
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         145
##   NOT incresed  higher than cutoff       86        4322
## [1] "FR_01"
## [1] 6
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         144
##   NOT incresed  higher than cutoff       85        4323
## [1] "FR_01"
## [1] 7
## [1] 98.57698
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         141
##   NOT incresed  higher than cutoff       85        4326

## [1] "FR_03"
## [1] 0
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                3
##   NOT incresed  higher than cutoff         143
## [1] "FR_03"
## [1] 1
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                5
##   NOT incresed  higher than cutoff         141
## [1] "FR_03"
## [1] 2
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                5
##   NOT incresed  higher than cutoff         141
## [1] "FR_03"
## [1] 3
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                5
##   NOT incresed  higher than cutoff         141
## [1] "FR_03"
## [1] 4
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                9
##   NOT incresed  higher than cutoff         137
## [1] "FR_03"
## [1] 5
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff               12
##   NOT incresed  higher than cutoff         134
## [1] "FR_03"
## [1] 6
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                6
##   NOT incresed  higher than cutoff         140
## [1] "FR_03"
## [1] 7
## [1] 116.7006
##                                   
##                                    no exposure
##   incresed higher than cutoff                9
##   NOT incresed  higher than cutoff         137

## [1] "FR_04"
## [1] 0
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1           5
##   NOT incresed  higher than cutoff        5         456
## [1] "FR_04"
## [1] 1
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          11
##   NOT incresed  higher than cutoff        6         450
## [1] "FR_04"
## [1] 2
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          10
##   NOT incresed  higher than cutoff        6         451
## [1] "FR_04"
## [1] 3
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          17
##   NOT incresed  higher than cutoff        6         444
## [1] "FR_04"
## [1] 4
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          17
##   NOT incresed  higher than cutoff        6         444
## [1] "FR_04"
## [1] 5
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          18
##   NOT incresed  higher than cutoff        6         443
## [1] "FR_04"
## [1] 6
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          18
##   NOT incresed  higher than cutoff        6         443
## [1] "FR_04"
## [1] 7
## [1] 84.50822
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0          16
##   NOT incresed  higher than cutoff        6         445

## [1] "FR_06"
## [1] 0
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff            34         125
##   NOT incresed  higher than cutoff      255       11459
## [1] "FR_06"
## [1] 1
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         294
##   NOT incresed  higher than cutoff      287       11290
## [1] "FR_06"
## [1] 2
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             9         314
##   NOT incresed  higher than cutoff      280       11270
## [1] "FR_06"
## [1] 3
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             5         341
##   NOT incresed  higher than cutoff      284       11243
## [1] "FR_06"
## [1] 4
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0         361
##   NOT incresed  higher than cutoff      289       11223
## [1] "FR_06"
## [1] 5
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             4         362
##   NOT incresed  higher than cutoff      285       11222
## [1] "FR_06"
## [1] 6
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             7         354
##   NOT incresed  higher than cutoff      282       11230
## [1] "FR_06"
## [1] 7
## [1] 77.10062
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         368
##   NOT incresed  higher than cutoff      286       11216

## [1] "FR_07"
## [1] 0
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             5          82
##   NOT incresed  higher than cutoff      103        6679
## [1] "FR_07"
## [1] 1
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         127
##   NOT incresed  higher than cutoff      106        6634
## [1] "FR_07"
## [1] 2
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         146
##   NOT incresed  higher than cutoff      105        6615
## [1] "FR_07"
## [1] 3
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         149
##   NOT incresed  higher than cutoff      105        6612
## [1] "FR_07"
## [1] 4
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         158
##   NOT incresed  higher than cutoff      106        6603
## [1] "FR_07"
## [1] 5
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         165
##   NOT incresed  higher than cutoff      106        6596
## [1] "FR_07"
## [1] 6
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         174
##   NOT incresed  higher than cutoff      105        6587
## [1] "FR_07"
## [1] 7
## [1] 70.11615
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             5         186
##   NOT incresed  higher than cutoff      103        6575

## [1] "FR_10"
## [1] 0
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2          89
##   NOT incresed  higher than cutoff       41        6672
## [1] "FR_10"
## [1] 1
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         126
##   NOT incresed  higher than cutoff       42        6635
## [1] "FR_10"
## [1] 2
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0         143
##   NOT incresed  higher than cutoff       43        6618
## [1] "FR_10"
## [1] 3
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         152
##   NOT incresed  higher than cutoff       42        6609
## [1] "FR_10"
## [1] 4
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0         154
##   NOT incresed  higher than cutoff       43        6607
## [1] "FR_10"
## [1] 5
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         156
##   NOT incresed  higher than cutoff       42        6605
## [1] "FR_10"
## [1] 6
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0         173
##   NOT incresed  higher than cutoff       43        6588
## [1] "FR_10"
## [1] 7
## [1] 84.97504
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         190
##   NOT incresed  higher than cutoff       42        6571

## [1] "FR_11"
## [1] 0
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           3
##   NOT incresed  higher than cutoff        4         288
## [1] "FR_11"
## [1] 1
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           7
##   NOT incresed  higher than cutoff        4         284
## [1] "FR_11"
## [1] 2
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           6
##   NOT incresed  higher than cutoff        4         285
## [1] "FR_11"
## [1] 3
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           8
##   NOT incresed  higher than cutoff        4         283
## [1] "FR_11"
## [1] 4
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           7
##   NOT incresed  higher than cutoff        4         284
## [1] "FR_11"
## [1] 5
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           6
##   NOT incresed  higher than cutoff        4         285
## [1] "FR_11"
## [1] 6
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           6
##   NOT incresed  higher than cutoff        4         285
## [1] "FR_11"
## [1] 7
## [1] 105.6557
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             0           7
##   NOT incresed  higher than cutoff        4         284

## [1] "FR_14"
## [1] 0
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             4          42
##   NOT incresed  higher than cutoff      167        6747
## [1] "FR_14"
## [1] 1
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1          82
##   NOT incresed  higher than cutoff      170        6707
## [1] "FR_14"
## [1] 2
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         105
##   NOT incresed  higher than cutoff      170        6684
## [1] "FR_14"
## [1] 3
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         113
##   NOT incresed  higher than cutoff      170        6676
## [1] "FR_14"
## [1] 4
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             4         120
##   NOT incresed  higher than cutoff      167        6669
## [1] "FR_14"
## [1] 5
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             1         130
##   NOT incresed  higher than cutoff      170        6659
## [1] "FR_14"
## [1] 6
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             2         130
##   NOT incresed  higher than cutoff      169        6659
## [1] "FR_14"
## [1] 7
## [1] 99.65099
##                                   
##                                    exposure no exposure
##   incresed higher than cutoff             3         138
##   NOT incresed  higher than cutoff      168        6651

## [1] "NO_10"
## [1] 0
## [1] 361.8502
##                                   
##                                    no exposure
##   NOT incresed  higher than cutoff           3
## [1] "NO_10"
## [1] 1
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "NO_10"
## [1] 2
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "NO_10"
## [1] 3
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "NO_10"
## [1] 4
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "NO_10"
## [1] 5
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "NO_10"
## [1] 6
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2
## [1] "NO_10"
## [1] 7
## [1] 361.8502
##                                   
##                                    no exposure
##   incresed higher than cutoff                1
##   NOT incresed  higher than cutoff           2