Weekly Results
Full Results
Tables compared each day
veri %>%
group_by(Job) %>%
summarise(Count = length(Job)) %>%
cbind('Run Time' =runtime$RunTime) %>%
t() %>%
kable('html', digits = 2) %>%
kable_styling(bootstrap_options = c("striped", "hover"),full_width = F)
|
Job
|
Sunday
|
Monday
|
Tuesday
|
Wednesday
|
Thursday
|
Friday
|
Saturday
|
|
Count
|
1
|
243
|
99
|
450
|
627
|
79
|
1
|
|
Run Time
|
3:09:15
|
1:30:54
|
2:15:02
|
1:03:47
|
1:45:26
|
1:03:23
|
8:08:06
|
veri %>%
group_by(Job) %>%
summarise(CPUTime = sum(seconds(RunDuration))) %>%
ggplot(aes(x = Job, y = CPUTime, fill = CPUTime)) +
geom_bar(stat = 'identity') +
labs(y = 'CPU Time (Seconds)', x = 'Day', title = 'CPU Time by Day') +
theme_few() +
scale_fill_gradient(low = 'forestgreen' , high = 'gold') +
theme(legend.position = 'none')

Full Results for the week
veri.full <- as.data.frame(veri[,-2])
datatable(veri.full)
Out of Sync Tables
Sync Status Summary
veri %>%
summarise('In-Sync' = sum(SyncStatus == 'In-Sync'),
'Out-Of-Sync' = sum(SyncStatus == 'Out-Of-Sync'),
'Failed' = sum(SyncStatus == 'Failed'))%>%
kable('html', digits = 2) %>%
kable_styling(bootstrap_options = c("striped", "hover"),full_width = F)
|
In-Sync
|
Out-Of-Sync
|
Failed
|
|
1450
|
50
|
0
|
SyncCount <-data.frame(group = c('In-Sync', 'Out-Of-Sync', 'Failed') ,
value = c(sum(veri$SyncStatus == 'In-Sync'), sum(veri$SyncStatus == 'Out-Of-Sync'), sum(veri$SyncStatus == 'Failed')))
ggplot(SyncCount , aes(x = factor(1), y= value, fill = group)) +
geom_bar(width = 1, stat = 'identity', position = 'fill') +
coord_polar('y', start = 0) +
blank_theme +
theme(legend.title = element_blank(),
axis.title.x = element_blank(),
axis.text.y = element_blank())+
#geom_text(aes(y = value/3 + c(0, cumsum(value)[-length(value)]),
#label = percent(value/sum(value))), size=4) +
scale_fill_manual(values = c('darkred' , '#114E2F','#B78634'))

veri.OOS <- as.data.frame(veri) %>%
filter(SyncStatus == 'Out-Of-Sync' | SyncStatus == 'Failed') %>%
select(Schema, DB2Table, OracleTable, OOSPercent, RowsOutOfSync, RowsCompared, SyncStatus) %>%
arrange(desc(RowsOutOfSync))
datatable(veri.OOS)
OOS by Schema
veri %>%
group_by(Schema) %>%
summarise('In-Sync' = sum(SyncStatus == 'In-Sync'),
'Out-Of-Sync' = sum(SyncStatus == 'Out-Of-Sync'),
'Failed' = sum(SyncStatus == 'Failed')) %>%
t() %>%
kable('html', digits = 2) %>%
kable_styling(bootstrap_options = c("striped", "hover"),full_width = F)
|
Schema
|
1
|
2
|
3
|
4
|
5
|
6
|
7
|
8
|
9
|
10
|
11
|
12
|
13
|
14
|
15
|
|
In-Sync
|
232
|
3
|
67
|
4
|
75
|
154
|
207
|
37
|
194
|
261
|
187
|
1
|
1
|
1
|
26
|
|
Out-Of-Sync
|
12
|
0
|
1
|
0
|
4
|
0
|
3
|
15
|
12
|
2
|
0
|
0
|
0
|
0
|
1
|
|
Failed
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
ggplot(veri, aes(x = Schema, fill = SyncStatus)) +
geom_bar(position = 'fill') +
coord_flip() +
blank_theme +
theme(axis.ticks.y = element_blank(),
legend.title = element_blank() ,
strip.text.x = element_text(size = 8)) +
scale_fill_manual(values = c('#114E2F','#B78634' , 'darkred'))

veri.OOS <- veri %>%
filter(SyncStatus == 'Out-Of-Sync' | SyncStatus == 'Failed') %>%
select(Schema, DB2Table, OracleTable, OOSPercent, RowsOutOfSync, RowsCompared, SyncStatus) %>%
arrange(Schema)
datatable(veri.OOS)
OOS by Day
veri %>%
group_by(Job) %>%
summarise('In-Sync' = sum(SyncStatus == 'In-Sync'),
'Out-Of-Sync' = sum(SyncStatus == 'Out-Of-Sync'),
'Failed' = sum(SyncStatus == 'Failed')) %>%
t() %>%
kable('html', digits = 2) %>%
kable_styling(bootstrap_options = c("striped", "hover"),full_width = F)
|
Job
|
Sunday
|
Monday
|
Tuesday
|
Wednesday
|
Thursday
|
Friday
|
Saturday
|
|
In-Sync
|
1
|
228
|
97
|
426
|
622
|
75
|
1
|
|
Out-Of-Sync
|
0
|
15
|
2
|
24
|
5
|
4
|
0
|
|
Failed
|
0
|
0
|
0
|
0
|
0
|
0
|
0
|
ggplot(veri, aes(x = Job, fill = SyncStatus)) +
geom_bar(position = 'fill') +
coord_flip() +
blank_theme +
theme(axis.ticks.y = element_blank(),
legend.title = element_blank() ,
strip.text.x = element_text(size = 8)) +
scale_fill_manual(values = c('#114E2F','#B78634', 'darkred')) +
scale_x_discrete(limit = c('Saturday', 'Friday','Thursday','Wednesday','Tuesday','Monday','Sunday'))

veri.OOS <- veri %>%
filter(SyncStatus == 'Out-Of-Sync' | SyncStatus == 'Failed') %>%
select(Job, Schema, DB2Table, OracleTable, OOSPercent, RowsOutOfSync, RowsCompared, SyncStatus) %>%
arrange(Job)
datatable(veri.OOS)