rm(list = ls())
library(officer)
## Warning: package 'officer' was built under R version 4.2.3
dir_path <- "D:\\2024\\20231218_kinase\\20240501_kinasedata_05_NA\\20240501_ppv\\"
dir_path_name <- dir(dir_path,pattern = "2024-05-01-ppv_for_plot_cutoff.*.csv",full.names = T)
ppt <- read_pptx()
ppt <- add_slide(ppt, layout = "Title Slide", master = "Office Theme")
ppt <- ph_with(ppt, value = "Hit rateV", location = ph_location_type(type = "ctrTitle"))
ppt <- ph_with(ppt, value = "kinase", location = ph_location_type(type = "subTitle"))
for (i in 1:length(dir_path_name)) {
print(i)
data_1 <- read.csv(dir_path_name[i], header = T, stringsAsFactors = F)
print(dim(data_1))
data_1[, 6:12] <- round(data_1[, 6:12], digits = 2)
print(head(data_1[, 6:12]))
print(head(round(data_1[, 6:12], digits = 2)))
data_1$accuracy <- data_1$NPV <- data_1$F1_score <- NULL
data_1 <- data_1[order(data_1$geneid), ]
data_1$cutoff <- gsub(".csv", "", gsub(".*_", "", dir_path_name[i]))
ppt <- add_slide(ppt, layout = "Title and Content", master = "Office Theme")
ppt <- ph_with(ppt, value = unique(data_1$cutoff), location = ph_location(left = 0.1,
top = 0.1, width = 2,
height = 1))
ppt <- ph_with(ppt, value = data_1, location = ph_location(left = 1,
top = .1, width = 12,
height = 5))
}
## [1] 1
## [1] 30 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.41 0.71 0.70 0.01 0.99 0.56 0.03
## 2 0.31 0.79 0.77 0.06 0.96 0.55 0.10
## 3 0.15 0.85 0.82 0.04 0.96 0.50 0.06
## 4 0.26 0.78 0.69 0.21 0.82 0.52 0.23
## 5 0.36 0.72 0.69 0.09 0.94 0.54 0.14
## 6 0.30 0.75 0.74 0.03 0.97 0.52 0.06
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.41 0.71 0.70 0.01 0.99 0.56 0.03
## 2 0.31 0.79 0.77 0.06 0.96 0.55 0.10
## 3 0.15 0.85 0.82 0.04 0.96 0.50 0.06
## 4 0.26 0.78 0.69 0.21 0.82 0.52 0.23
## 5 0.36 0.72 0.69 0.09 0.94 0.54 0.14
## 6 0.30 0.75 0.74 0.03 0.97 0.52 0.06
## [1] 2
## [1] 30 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.09 0.92 0.91 0.01 0.99 0.50 0.02
## 2 0.08 0.96 0.92 0.08 0.96 0.52 0.08
## 3 0.02 0.98 0.94 0.03 0.96 0.50 0.02
## 4 0.04 0.97 0.80 0.22 0.82 0.50 0.07
## 5 0.10 0.95 0.89 0.13 0.93 0.52 0.11
## 6 0.03 0.99 0.96 0.07 0.97 0.51 0.04
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.09 0.92 0.91 0.01 0.99 0.50 0.02
## 2 0.08 0.96 0.92 0.08 0.96 0.52 0.08
## 3 0.02 0.98 0.94 0.03 0.96 0.50 0.02
## 4 0.04 0.97 0.80 0.22 0.82 0.50 0.07
## 5 0.10 0.95 0.89 0.13 0.93 0.52 0.11
## 6 0.03 0.99 0.96 0.07 0.97 0.51 0.04
## [1] 3
## [1] 30 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 0.99 0.98 0.03 0.99 0.51 0.03
## 2 0.03 1.00 0.95 0.22 0.96 0.51 0.05
## 3 0.01 1.00 0.96 0.25 0.96 0.50 0.01
## 4 0.01 1.00 0.81 0.36 0.81 0.50 0.01
## 5 0.03 1.00 0.93 0.38 0.93 0.51 0.05
## 6 0.01 1.00 0.97 1.00 0.97 0.51 0.02
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 0.99 0.98 0.03 0.99 0.51 0.03
## 2 0.03 1.00 0.95 0.22 0.96 0.51 0.05
## 3 0.01 1.00 0.96 0.25 0.96 0.50 0.01
## 4 0.01 1.00 0.81 0.36 0.81 0.50 0.01
## 5 0.03 1.00 0.93 0.38 0.93 0.51 0.05
## 6 0.01 1.00 0.97 1.00 0.97 0.51 0.02
## [1] 4
## [1] 30 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.2 0.99 0.51 0.05
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.01 1 0.96 0.5 0.96 0.50 0.01
## 4 0.00 1 0.81 0.5 0.81 0.50 0.01
## 5 0.01 1 0.93 0.5 0.93 0.50 0.02
## 6 0.01 1 0.97 1.0 0.97 0.51 0.02
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.2 0.99 0.51 0.05
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.01 1 0.96 0.5 0.96 0.50 0.01
## 4 0.00 1 0.81 0.5 0.81 0.50 0.01
## 5 0.01 1 0.93 0.5 0.93 0.50 0.02
## 6 0.01 1 0.97 1.0 0.97 0.51 0.02
## [1] 5
## [1] 29 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.50 0.99 0.51 0.06
## 2 0.01 1 0.96 1.00 0.96 0.50 0.02
## 3 0.01 1 0.96 0.50 0.96 0.50 0.01
## 4 0.01 1 0.93 1.00 0.93 0.50 0.02
## 5 0.01 1 0.97 1.00 0.97 0.51 0.02
## 6 0.01 1 0.82 0.75 0.82 0.50 0.01
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.50 0.99 0.51 0.06
## 2 0.01 1 0.96 1.00 0.96 0.50 0.02
## 3 0.01 1 0.96 0.50 0.96 0.50 0.01
## 4 0.01 1 0.93 1.00 0.93 0.50 0.02
## 5 0.01 1 0.97 1.00 0.97 0.51 0.02
## 6 0.01 1 0.82 0.75 0.82 0.50 0.01
## [1] 6
## [1] 27 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.5 0.99 0.51 0.06
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.01 1 0.96 0.5 0.96 0.50 0.01
## 4 0.00 1 0.93 1.0 0.93 0.50 0.01
## 5 0.01 1 0.97 1.0 0.97 0.51 0.02
## 6 0.00 1 0.82 1.0 0.82 0.50 0.01
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.5 0.99 0.51 0.06
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.01 1 0.96 0.5 0.96 0.50 0.01
## 4 0.00 1 0.93 1.0 0.93 0.50 0.01
## 5 0.01 1 0.97 1.0 0.97 0.51 0.02
## 6 0.00 1 0.82 1.0 0.82 0.50 0.01
## [1] 7
## [1] 24 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.5 0.99 0.51 0.06
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.01 1 0.96 0.5 0.96 0.50 0.01
## 4 0.00 1 0.82 1.0 0.82 0.50 0.01
## 5 0.00 1 0.89 1.0 0.89 0.50 0.01
## 6 0.00 1 0.83 1.0 0.83 0.50 0.00
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.5 0.99 0.51 0.06
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.01 1 0.96 0.5 0.96 0.50 0.01
## 4 0.00 1 0.82 1.0 0.82 0.50 0.01
## 5 0.00 1 0.89 1.0 0.89 0.50 0.01
## 6 0.00 1 0.83 1.0 0.83 0.50 0.00
## [1] 8
## [1] 19 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.5 0.99 0.51 0.06
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.00 1 0.96 0.0 0.96 0.50 0.00
## 4 0.00 1 0.82 1.0 0.82 0.50 0.00
## 5 0.00 1 0.89 1.0 0.89 0.50 0.01
## 6 0.00 1 0.83 1.0 0.83 0.50 0.00
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 0.5 0.99 0.51 0.06
## 2 0.01 1 0.96 1.0 0.96 0.50 0.02
## 3 0.00 1 0.96 0.0 0.96 0.50 0.00
## 4 0.00 1 0.82 1.0 0.82 0.50 0.00
## 5 0.00 1 0.89 1.0 0.89 0.50 0.01
## 6 0.00 1 0.83 1.0 0.83 0.50 0.00
## [1] 9
## [1] 12 13
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 1 0.99 0.51 0.06
## 2 0.01 1 0.96 1 0.96 0.50 0.02
## 3 0.00 1 0.82 1 0.82 0.50 0.00
## 4 0.00 1 0.89 1 0.89 0.50 0.01
## 5 0.01 1 0.95 1 0.95 0.50 0.01
## 6 0.00 1 0.88 1 0.88 0.50 0.01
## sensitivity specificity accuracy PPV NPV BA F1_score
## 1 0.03 1 0.99 1 0.99 0.51 0.06
## 2 0.01 1 0.96 1 0.96 0.50 0.02
## 3 0.00 1 0.82 1 0.82 0.50 0.00
## 4 0.00 1 0.89 1 0.89 0.50 0.01
## 5 0.01 1 0.95 1 0.95 0.50 0.01
## 6 0.00 1 0.88 1 0.88 0.50 0.01
?ph_location
## starting httpd help server ... done
print(ppt, target = paste0(dir_path, Sys.Date(),"output_presentation9.pptx"))