Browse code

ready for bioconductor

veitveit authored on 18/07/2022 11:59:30
Showing 38 changed files

... ...
@@ -1,172 +1,3 @@
1
-}
2
-plot.default(x = NA, xlim = c(1, dim(dat)[[2]]),
3
-ylim = c(ymin, ymax), xlab = xlab, ylab = ylab,
4
-main = paste("Cluster", j), axes = FALSE)
5
-if (missing(time.labels)) {
6
-axis(1, 1:dim(dat)[[2]], c(1:dim(dat)[[2]]))
7
-axis(2)
8
-}
9
-else {
10
-axis(1, 1:dim(dat)[[2]], time.labels)
11
-axis(2)
12
-}
13
-}
14
-else {
15
-if (sum(clusterindex == j) == 0) {
16
-ymin <- -1
17
-ymax <- +1
18
-}
19
-else {
20
-ymin <- min(tmp)
21
-ymax <- max(tmp)
22
-}
23
-plot.default(x = NA, xlim = c(1, dim(dat)[[2]]),
24
-ylim = c(ymin, ymax), xlab = xlab, ylab = ylab,
25
-main = paste("Cluster", j), axes = FALSE)
26
-if (missing(time.labels)) {
27
-axis(1, 1:dim(dat)[[2]], c(1:dim(dat)[[2]]))
28
-axis(2)
29
-}
30
-else {
31
-axis(1, 1:dim(dat)[[2]], time.labels)
32
-axis(2)
33
-}
34
-}
35
-if (!(sum(clusterindex == j) == 0)) {
36
-for (jj in 1:(length(colorseq) - 1)) {
37
-tmpcol <- (tmpmem >= colorseq[jj] & tmpmem <=
38
-colorseq[jj + 1])
39
-print(colorseq)
40
-if (sum(tmpcol, na.rm=T) > 0) {
41
-tmpind <- which(tmpcol)
42
-for (k in 1:length(tmpind)) {
43
-lines(tmp[tmpind[k], ], col = colo[jj])
44
-}
45
-}
46
-}
47
-}
48
-}
49
-if (!is.na(filename))   dev.off()
50
-}
51
-## Plot results
52
-mfuzz.plot(tData,cl=Bestcl,mfrow=c(round(sqrt(NClust)),ceiling(sqrt(NClust))),min.mem=0.5,colo="fancy")
53
-mfuzz.plot <- function (dat, cl, mfrow = c(1, 1), colo, min.mem = 0, time.labels,
54
-filename=NA,xlab="Time",ylab="Expression changes")
55
-{
56
-clusterindex <- cl[[3]]
57
-memship <- cl[[4]]
58
-memship[memship < min.mem] <- -1
59
-colorindex <- integer(dim(dat)[[1]])
60
-if (missing(colo)) {
61
-colo <- c("#FF8F00", "#FFA700", "#FFBF00", "#FFD700",
62
-"#FFEF00", "#F7FF00", "#DFFF00", "#C7FF00", "#AFFF00",
63
-"#97FF00", "#80FF00", "#68FF00", "#50FF00", "#38FF00",
64
-"#20FF00", "#08FF00", "#00FF10", "#00FF28", "#00FF40",
65
-"#00FF58", "#00FF70", "#00FF87", "#00FF9F", "#00FFB7",
66
-"#00FFCF", "#00FFE7", "#00FFFF", "#00E7FF", "#00CFFF",
67
-"#00B7FF", "#009FFF", "#0087FF", "#0070FF", "#0058FF",
68
-"#0040FF", "#0028FF", "#0010FF", "#0800FF", "#2000FF",
69
-"#3800FF", "#5000FF", "#6800FF", "#8000FF", "#9700FF",
70
-"#AF00FF", "#C700FF", "#DF00FF", "#F700FF", "#FF00EF",
71
-"#FF00D7", "#FF00BF", "#FF00A7", "#FF008F", "#FF0078",
72
-"#FF0060", "#FF0048", "#FF0030", "#FF0018")
73
-}
74
-colorseq <- seq(0, 1, length = length(colo))
75
-print(colorseq)
76
-for (j in 1:max(clusterindex)) {
77
-tmp <- dat[clusterindex == j, ]
78
-tmpmem <- memship[clusterindex == j, j]
79
-if (((j - 1)%%(mfrow[1] * mfrow[2])) == 0) {
80
-if (!is.na(filename)) {
81
-pdf(filename, height=3*mfrow[1],width=3*mfrow[2])
82
-}
83
-par(mfrow = mfrow, cex=0.5)
84
-if (sum(clusterindex == j) == 0) {
85
-ymin <- -1
86
-ymax <- +1
87
-}
88
-else {
89
-ymin <- min(tmp)
90
-ymax <- max(tmp)
91
-}
92
-plot.default(x = NA, xlim = c(1, dim(dat)[[2]]),
93
-ylim = c(ymin, ymax), xlab = xlab, ylab = ylab,
94
-main = paste("Cluster", j), axes = FALSE)
95
-if (missing(time.labels)) {
96
-axis(1, 1:dim(dat)[[2]], c(1:dim(dat)[[2]]))
97
-axis(2)
98
-}
99
-else {
100
-axis(1, 1:dim(dat)[[2]], time.labels)
101
-axis(2)
102
-}
103
-}
104
-else {
105
-if (sum(clusterindex == j) == 0) {
106
-ymin <- -1
107
-ymax <- +1
108
-}
109
-else {
110
-ymin <- min(tmp)
111
-ymax <- max(tmp)
112
-}
113
-plot.default(x = NA, xlim = c(1, dim(dat)[[2]]),
114
-ylim = c(ymin, ymax), xlab = xlab, ylab = ylab,
115
-main = paste("Cluster", j), axes = FALSE)
116
-if (missing(time.labels)) {
117
-axis(1, 1:dim(dat)[[2]], c(1:dim(dat)[[2]]))
118
-axis(2)
119
-}
120
-else {
121
-axis(1, 1:dim(dat)[[2]], time.labels)
122
-axis(2)
123
-}
124
-}
125
-if (!(sum(clusterindex == j) == 0)) {
126
-for (jj in 1:(length(colorseq) - 1)) {
127
-tmpcol <- (tmpmem >= colorseq[jj] & tmpmem <=
128
-colorseq[jj + 1])
129
-if (sum(tmpcol, na.rm=T) > 0) {
130
-tmpind <- which(tmpcol)
131
-for (k in 1:length(tmpind)) {
132
-lines(tmp[tmpind[k], ], col = colo[jj])
133
-}
134
-}
135
-}
136
-}
137
-}
138
-if (!is.na(filename))   dev.off()
139
-}
140
-## Plot results
141
-mfuzz.plot(tData,cl=Bestcl,mfrow=c(round(sqrt(NClust)),ceiling(sqrt(NClust))),min.mem=0.5,colo="fancy")
142
-library(Mfuzz)
143
-Mfuzz::mfuzz.plot2
144
-mfuzz.plot <- function (dat, cl, mfrow = c(1, 1), colo, min.mem = 0, time.labels,
145
-filename=NA,xlab="Time",ylab="Expression changes")
146
-{
147
-clusterindex <- cl[[3]]
148
-memship <- cl[[4]]
149
-memship[memship < min.mem] <- -1
150
-colorindex <- integer(dim(dat)[[1]])
151
-if (missing(colo)) {
152
-colo <- c("#FF8F00", "#FFA700", "#FFBF00", "#FFD700",
153
-"#FFEF00", "#F7FF00", "#DFFF00", "#C7FF00", "#AFFF00",
154
-"#97FF00", "#80FF00", "#68FF00", "#50FF00", "#38FF00",
155
-"#20FF00", "#08FF00", "#00FF10", "#00FF28", "#00FF40",
156
-"#00FF58", "#00FF70", "#00FF87", "#00FF9F", "#00FFB7",
157
-"#00FFCF", "#00FFE7", "#00FFFF", "#00E7FF", "#00CFFF",
158
-"#00B7FF", "#009FFF", "#0087FF", "#0070FF", "#0058FF",
159
-"#0040FF", "#0028FF", "#0010FF", "#0800FF", "#2000FF",
160
-"#3800FF", "#5000FF", "#6800FF", "#8000FF", "#9700FF",
161
-"#AF00FF", "#C700FF", "#DF00FF", "#F700FF", "#FF00EF",
162
-"#FF00D7", "#FF00BF", "#FF00A7", "#FF008F", "#FF0078",
163
-"#FF0060", "#FF0048", "#FF0030", "#FF0018")
164
-}    else {
165
-if (colo == "fancy") {
166
-fancy.blue <- c(c(255:0), rep(0, length(c(255:0))),
167
-rep(0, length(c(255:150))))
168
-fancy.green <- c(c(0:255), c(255:0), rep(0, length(c(255:150))))
169
-fancy.red <- c(c(0:255), rep(255, length(c(255:0))),
170 1
 c(255:150))
171 2
 colo <- rgb(b = fancy.blue/255, g = fancy.green/255,
172 3
 r = fancy.red/255)
... ...
@@ -510,3 +341,172 @@ summary(lm.out)
510 341
 lm.out_i <- lm(len ~ supp * dose, data=ToothGrowth)
511 342
 summary(lm.out_i)
512 343
 anova(lm.out, lm.out_i)
344
+library(vsclust)
345
+set.seed(0)
346
+data("artificial_clusters")
347
+dat <- averageCond(artificial_clusters, 5, 10)
348
+dat <- scale(dat)
349
+dat <- cbind(dat, 1)
350
+ClustInd <- estimClustNum(dat, 10)
351
+optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust")
352
+expect_equal(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust"), 6)
353
+estimClust.plot(ClustInd)
354
+library(vsclust)
355
+```{r echo=F}
356
+library(vsclust)
357
+require(yaml)
358
+require(shiny)
359
+require(clusterProfiler)
360
+require(matrixStats)
361
+```
362
+## Initialization
363
+```{r setup, include=FALSE}
364
+knitr::opts_chunk$set(echo = TRUE)
365
+```
366
+knitr::opts_chunk$set(echo = TRUE)
367
+data(protein_expressions)
368
+dat <- protein_expressions
369
+#### running statistical analysis and estimation of individual variances
370
+statOut <- PreparedForVSClust(dat, NumReps, NumCond, isPaired, TRUE)
371
+#### Estimate number of clusters with maxClust as maximum number clusters to run
372
+#### the estimation with
373
+ClustInd <- estimClustNum(dat, maxClust, cores)
374
+#### Use estimate cluster number or use own
375
+if (PreSetNumClustVSClust == 0)
376
+PreSetNumClustVSClust <- optimalClustNum(ClustInd)
377
+if (PreSetNumClustStand == 0)
378
+PreSetNumClustStand <- optimalClustNum(ClustInd, method="FCM")
379
+#### Visualize
380
+estimClust.plot(ClustInd)
381
+ClustInd
382
+par(mfrow=c(1,3))
383
+maxClust <- ncol(ClustInd)-2
384
+plot(3:maxClust,ClustInd[1:nrow(ClustInd),"MinCentroidDist_VSClust"],col=2 , type="b",
385
+main="Min. centroid distance\n(Highest jump is best)",
386
+xlab="Number of clusters", ylab="Index",
387
+ylim=c(min(ClustInd[,grep("MinCentroidDist", colnames(ClustInd))],na.rm=T),
388
+max(ClustInd[,grep("MinCentroidDist", colnames(ClustInd))],na.rm=T)))
389
+ClustInd[1:nrow(ClustInd),"MinCentroidDist_VSClust"]
390
+3:maxClust
391
+library(vsclust)
392
+par(mfrow=c(1,3))
393
+maxClust <- nrow(ClustInd)-2
394
+plot(3:maxClust,ClustInd[1:nrow(ClustInd),"MinCentroidDist_VSClust"],col=2 , type="b",
395
+main="Min. centroid distance\n(Highest jump is best)",
396
+xlab="Number of clusters", ylab="Index",
397
+ylim=c(min(ClustInd[,grep("MinCentroidDist", colnames(ClustInd))],na.rm=T),
398
+max(ClustInd[,grep("MinCentroidDist", colnames(ClustInd))],na.rm=T)))
399
+plot(3:maxClust,ClustInd[1:nrow(ClustInd),"MinCentroidDist_VSClust"])
400
+3:maxClust
401
+maxClust <- nrow(ClustInd)+2
402
+plot(3:maxClust,ClustInd[1:nrow(ClustInd),"MinCentroidDist_VSClust"],col=2 , type="b",
403
+main="Min. centroid distance\n(Highest jump is best)",
404
+xlab="Number of clusters", ylab="Index",
405
+ylim=c(min(ClustInd[,grep("MinCentroidDist", colnames(ClustInd))],na.rm=T),
406
+max(ClustInd[,grep("MinCentroidDist", colnames(ClustInd))],na.rm=T)))
407
+library(vsclust)
408
+#### Estimate number of clusters with maxClust as maximum number clusters to run
409
+#### the estimation with
410
+ClustInd <- estimClustNum(dat, maxClust, cores)
411
+library(vsclust)
412
+require(yaml)
413
+require(shiny)
414
+require(clusterProfiler)
415
+require(matrixStats)
416
+## at computproteomics.bmb.sdu.dk/Apps/VSClust
417
+# name of study
418
+Experiment <- "ProtExample"
419
+# Number of replicates/sample per different experimental condition (sample type)
420
+NumReps <- 3
421
+# Number of different experimental conditions (e.g. time points or sample types)
422
+NumCond <- 4
423
+# Paired or unpaired statistical tests when carrying out LIMMA for statistical testing
424
+isPaired <- FALSE
425
+# Number of threads to accelerate the calculation (use 1 in doubt)
426
+cores <- 2
427
+# If 0 (default), then automatically estimate the cluster number for the vsclust run
428
+# from the Minimum Centroid Distance
429
+PreSetNumClustVSClust <- 0
430
+# If 0 (default), then automatically estimate the cluster number for the original
431
+# fuzzy c-means from the Minimum Centroid Distance
432
+PreSetNumClustStand <- 0
433
+# max. number of clusters when estimating the number of clusters. Higher numbers
434
+# can drastically extend the computation time.
435
+maxClust <- 10
436
+data(protein_expressions)
437
+dat <- protein_expressions
438
+#### running statistical analysis and estimation of individual variances
439
+statOut <- PrepareForVSClust(dat, NumReps, NumCond, isPaired, TRUE)
440
+dat <- statOut$dat
441
+Sds <- dat[,ncol(dat)]
442
+print(paste("Features:",nrow(dat),"<br/>Missing values:",
443
+sum(is.na(dat)),"<br/>Median standard deviations:",
444
+round(median(Sds,na.rm=T),digits=3)))
445
+## Write output into file
446
+write.csv(statOut$statFileOut,paste("",Experiment,"statFileOut.csv",sep=""))
447
+#### Estimate number of clusters with maxClust as maximum number clusters to run
448
+#### the estimation with
449
+ClustInd <- estimClustNum(dat, maxClust, cores)
450
+#### Use estimate cluster number or use own
451
+if (PreSetNumClustVSClust == 0)
452
+PreSetNumClustVSClust <- optimalClustNum(ClustInd)
453
+if (PreSetNumClustStand == 0)
454
+PreSetNumClustStand <- optimalClustNum(ClustInd, method="FCM")
455
+#### Visualize
456
+#### Use estimate cluster number or use own
457
+if (PreSetNumClustVSClust == 0)
458
+PreSetNumClustVSClust <- optimalClustNum(ClustInd)
459
+if (PreSetNumClustStand == 0)
460
+PreSetNumClustStand <- optimalClustNum(ClustInd, method="FCM")
461
+#### Visualize
462
+estimClust.plot(ClustInd)
463
+if (PreSetNumClustVSClust == 0)
464
+PreSetNumClustVSClust <- optimalClustNum(ClustInd)
465
+if (PreSetNumClustStand == 0)
466
+PreSetNumClustStand <- optimalClustNum(ClustInd, method="FCM")
467
+estimClust.plot(ClustInd)
468
+ClustInd
469
+colnames(ClustInd)
470
+library(vsclust)
471
+library(vsclust)
472
+test_that("estimate_clust_num", {
473
+set.seed(0)
474
+data("artificial_clusters")
475
+dat <- averageCond(artificial_clusters, 5, 10)
476
+dat <- scale(dat)
477
+dat <- cbind(dat, 1)
478
+ClustInd <- estimClustNum(dat, 10)
479
+expect_equal(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust"), 6)
480
+})
481
+set.seed(0)
482
+data("artificial_clusters")
483
+dat <- averageCond(artificial_clusters, 5, 10)
484
+dat <- scale(dat)
485
+dat <- cbind(dat, 1)
486
+ClustInd <- estimClustNum(dat, 10)
487
+expect_equal(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust"), 6)
488
+optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust")
489
+library(testthat)
490
+test_that("estimate_clust_num", {
491
+set.seed(0)
492
+data("artificial_clusters")
493
+dat <- averageCond(artificial_clusters, 5, 10)
494
+dat <- scale(dat)
495
+dat <- cbind(dat, 1)
496
+ClustInd <- estimClustNum(dat, 10)
497
+expect_equal(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust"), 6)
498
+})
499
+optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust")
500
+unlist(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust"))
501
+optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust")
502
+?expect_equal
503
+expect_equal(as.numeric(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust")), 6)
504
+roxygen2::roxygenise()
505
+roxygen2::roxygenise()
506
+library(vsclust)
507
+roxygen2::roxygenise()
508
+library(vsclust)
509
+roxygen2::roxygenise()
510
+library(vsclust)
511
+roxygen2::roxygenise()
512
+BiocCheck::BiocCheck()
... ...
@@ -3,8 +3,12 @@ Type: Package
3 3
 Title: Feature-based variance-sensitive quantitative clustering
4 4
 Version: 0.99.0
5 5
 Date: 2022-03-23
6
-Author: Veit Schwaemmle
7
-Maintainer: Veit Schwaemmle <[email protected]>
6
+Authors@R: 
7
+    person(
8
+        "Veit", "Schwämmle",
9
+        email = "[email protected]",
10
+        role = c("aut", "cre")
11
+    )
8 12
 Description: Feature-based variance-sensitive clustering of omics data. Optimizes cluster assignment by taking into account individual feature variance. Includes several modules for statistical testing, clustering and enrichment analysis.
9 13
 License: GPL-2
10 14
 Imports: 
... ...
@@ -18,9 +22,10 @@ Imports:
18 22
   stats,
19 23
   graphics
20 24
 Suggests:
21
-  knitr,
22
-  yaml,
23
-  RDAVIDWebService
25
+    knitr,
26
+    yaml,
27
+    RDAVIDWebService,
28
+    testthat (>= 3.0.0)
24 29
 LinkingTo: Rcpp
25 30
 biocViews: 
26 31
   Clustering,
... ...
@@ -29,5 +34,7 @@ biocViews:
29 34
   DifferentialExpression,
30 35
   Visualization
31 36
 VignetteBuilder: knitr
32
-RoxygenNote: 7.1.2
37
+RoxygenNote: 7.2.0
33 38
 Depends: R (>= 4.2.0)
39
+Config/testthat/edition: 3
40
+LazyData: false
... ...
@@ -1,17 +1,21 @@
1 1
 # Generated by roxygen2: do not edit by hand
2 2
 
3 3
 export(ClustComp)
4
+export(PrepareForVSClust)
4 5
 export(SignAnalysis)
5 6
 export(SignAnalysisPaired)
6 7
 export(averageCond)
7 8
 export(calcBHI)
8 9
 export(cvalidate.xiebeni)
10
+export(determine_fuzz)
11
+export(estimClust.plot)
9 12
 export(estimClustNum)
10 13
 export(mfuzz.plot)
14
+export(optimalClustNum)
11 15
 export(pcaWithVar)
12 16
 export(runClustWrapper)
13 17
 export(runFuncEnrich)
14
-export(statWrapper)
18
+export(runVSClustApp)
15 19
 export(vsclust_algorithm)
16 20
 import(grDevices)
17 21
 import(graphics)
18 22
new file mode 100644
... ...
@@ -0,0 +1,3 @@
1
+Changes in version 0.99.0 (2022-07-20)
2
++ Submitted to Bioconductor
3
+
0 4
new file mode 100644
... ...
@@ -0,0 +1,575 @@
1
+"","Mean of log A","Mean of log B","Mean of log C","Mean of log D","Sds","qvalue BvsA","qvalue CvsA","qvalue DvsA"
2
+"A0JPQ4",-0.0584640145151373,0.279343355712768,0.0611012801504302,-0.0284327133929146,0.192165620444848,0.223813741892747,0.957920753321584,0.569492605639837
3
+"A1A5Q0",-0.093396819830051,0.087823863248159,0.006466789316186,0.202675198944195,0.247810964931142,0.462010643017102,0.974147078516161,0.233928151148954
4
+"A2RRU1",0.10921105588851,-0.0982947340169602,-0.0535184054187076,-0.0310827191800798,0.143828922006588,0.357678357316713,0.957920753321584,0.349524272150878
5
+"A2VD12",0.0335587192494114,-0.0336973070412727,-0.0388116932067597,0.112019142174564,0.159378968527449,0.568422303652732,0.97741806795415,0.488767759533134
6
+"A7VJC2",0.0178665323404056,-0.124852989930717,0.0794868140283187,0.0824551900391646,0.224659591919406,0.483864785078894,0.97741806795415,0.524987652945309
7
+"B0BNE5",0.0751801527670327,-0.186399111470377,0.145681342241459,-0.0666271333304151,0.164400493690139,0.274938185187905,0.972814020461651,0.325899615633489
8
+"B0BNN3",0.148411678732406,-0.479427036679414,0.49581696856496,-0.243324027705082,0.461864171010854,0.325260907342323,0.957920753321584,0.330105824716905
9
+"B0K020",-0.0268400716585397,0.0800173889753115,0.0396637441879417,0.492365497458791,0.434293233013363,0.595856935000949,0.986313879726913,0.233928151148954
10
+"B0LPN4",0.104186987471601,0.0395166294731077,0.0460622170301731,-0.00306445490657767,0.131761281706774,0.516793210759087,0.972814020461651,0.340848496230376
11
+"B1PRL5",-0.0533688060896668,0.0264858870685595,-0.07126285672908,-0.0100081266175088,0.125256207827171,0.483603738206818,0.986313879726913,0.504816101618169
12
+"B2GV06",-0.258845300460936,-0.114267866544982,0.117142318532443,0.171172873197972,0.201142912580732,0.463988989372019,0.819090345107141,0.0891265655101855
13
+"B2GV54",-0.213190763592191,0.0702377241174018,0.0263035645128417,0.294646904659281,0.319400542574955,0.463988989372019,0.957920753321584,0.220251596432954
14
+"B2RYW9",0.0880044884935739,-0.0594176159608398,-0.107489308582165,-0.0790673567223461,0.13512248890952,0.371120059621398,0.918963824676487,0.220971689547925
15
+"B2RZ37",-0.158799439881556,0.0396354151905009,-0.168414995425061,-0.040795593817101,0.250287869636375,0.440702476368183,0.997490783402258,0.464340481718604
16
+"B4F7A1",-0.147155915588493,0.0904013850092671,-0.173927074718814,0.148581025412328,0.307949172561711,0.4861393067047,0.997490783402258,0.351507839337377
17
+"D3Z9R8",-0.0689838726425953,0.15492750056114,-0.0287460957618842,0.196187560687582,0.176939729622097,0.339042678359112,0.97741806795415,0.165851107012955
18
+"D3ZAF6",-0.523873516692442,0.0354692185789597,-0.568535490036078,0.186920885761678,0.426566986030139,0.327977186925337,0.997490783402258,0.135898551264568
19
+"O08557",0.142185770704641,0.00198480797078145,0.31285626176405,-0.225535824754232,0.211353729938016,0.508554095922091,0.957920753321584,0.199758192329181
20
+"O08730",0.206100247087657,0.0572494223128282,-0.0364163847846283,-0.0978409620359757,0.129187085632078,0.352965111736937,0.819090345107141,0.0744659330693581
21
+"O35077",-0.20351931450112,-0.0157575549862678,-0.14841214161814,0.316156597210019,0.332925117244775,0.500510889969654,0.981564324221023,0.157266842252461
22
+"O35094",-0.133165860548899,0.111350360500223,-0.0973109254608017,-0.145154544901747,0.298309714397687,0.434953718301071,0.992876863671889,0.605280436646073
23
+"O35115",0.00985602089850286,-0.107411919170298,0.123029499938525,-0.321736658932138,0.267116483374061,0.538486115262159,0.972814020461651,0.220251596432954
24
+"O35244",-0.041480821053396,0.102604857395794,0.0696448574356016,-0.0279683096885686,0.168767595556762,0.431289321240626,0.957920753321584,0.594798498395272
25
+"O35264",0.0371278863865598,-0.0409477353006209,0.0701498740816748,-0.0570900322648837,0.157902726817815,0.552350536618654,0.980353676945748,0.463919759239624
26
+"O35303",-0.3579283896162,0.0560232154485946,-0.0198671139800295,0.290499315041856,0.385246096761559,0.431289321240626,0.957920753321584,0.207581829053658
27
+"O35413",-0.144779525575824,0.10215492332072,-0.169967169078821,0.110938912407411,0.255995055476948,0.407328288255029,0.997490783402258,0.286545066191089
28
+"O35567",0.00117533000759082,-0.0373360869650073,-0.00125789686374077,0.0540796982140028,0.12058540784528,0.575095428731566,0.997490783402258,0.481305710655275
29
+"O35763",4.99046300646659e-05,-0.03696129051811,-0.0940311609048468,-0.208830789734984,0.233123072899366,0.59983541821887,0.974147078516161,0.317197505516124
30
+"O35854",0.13215891119369,-0.344257671585134,0.1430429174591,0.0729037616108256,0.15032262749384,0.0425742156998337,0.997490783402258,0.488767759533134
31
+"O35878",-0.316235429545496,-0.0330440398304447,0.0702523446552643,0.182836660196641,0.293556949042474,0.407328288255029,0.950538863951467,0.132807085669857
32
+"O35987",0.585962210474773,-0.202766386428507,-0.381204441088125,0.209875002054447,0.358888145719801,0.249257850141774,0.819090345107141,0.336678927257811
33
+"O55171",-0.702598731017552,0.620003669493334,-0.619278901178445,0.956078893202644,0.362428400554607,0.028937065065633,0.97741806795415,0.0102408310273446
34
+"O70351",-0.16931971678353,0.472350828112864,0.044902169368997,0.571024583905128,0.443142924237497,0.319630928899267,0.97243804926483,0.135898551264568
35
+"O88600",0.148332109974765,-0.0386719029610256,-0.0215022427781558,-0.141003149965111,0.143843125876035,0.327977186925337,0.957920753321584,0.0984907412057059
36
+"O88761",-0.118052272883973,0.0515695557064095,-0.0560421283283102,0.0586933775947052,0.172880352897443,0.443147110106135,0.97741806795415,0.340848496230376
37
+"O88767",0.12264455520386,0.107423953811226,-0.133462655337122,0.0961273957567149,0.164533232637287,0.610792886755616,0.878686589410386,0.569373130475352
38
+"O88989",0.129459940105901,-0.0074051998576334,-0.0062353404206525,0.060250610319428,0.168207762868491,0.434953718301071,0.957920753321584,0.488268736041597
39
+"O89049",-0.722480272008595,0.307335985573696,-0.712090786619745,1.03758333848944,0.439846935451128,0.220456430479483,0.997490783402258,0.0518232865313916
40
+"P00388",0.13684018566208,0.0509670296701898,-0.460389935691536,0.199823874975901,0.204815751718272,0.568705576895717,0.819090345107141,0.538302429257628
41
+"P00406",-0.23188511637604,0.175063121642101,0.100336750405417,0.152949770585778,0.251796580890078,0.274794102390614,0.950538863951467,0.162957822053732
42
+"P00507",-0.175789450962338,0.0436787148244767,-0.0763228862760414,0.277074113648643,0.189400662473851,0.35272227389075,0.971241888225073,0.0744659330693581
43
+"P00564",0.139539905029137,0.0518621031311107,-0.00382424284805374,0.329799100527607,0.29255455738919,0.581283364937698,0.97243804926483,0.391712537169095
44
+"P01026",0.286855124312497,-0.905659636772354,0.904453837651664,-0.525401675866726,0.380156134277915,0.0433968503708084,0.878686589410386,0.0891265655101855
45
+"P01048",-0.196321560690724,-0.907738159524693,0.942314777804563,0.095701915430845,0.579535131450762,0.407328288255029,0.878686589410386,0.488299273705943
46
+"P01835",0.107547030671863,-0.105535777744563,-0.411262235397326,0.0809839074940406,0.655212677901047,0.573086632881269,0.957920753321584,0.605280436646073
47
+"P01836",1.09887219400446,-2.26251924841685,2.51424386599533,-1.8743392202988,0.720751702919299,0.0425742156998337,0.878686589410386,0.0489465453884627
48
+"P01946",0.365717934844168,-0.520271389997687,0.646528931721236,-0.233152504805263,0.377289540086595,0.120013628684448,0.957920753321584,0.153866100405144
49
+"P02091",0.126635266790525,-0.783130964193634,0.378471329088835,0.0961746787858793,0.651327112829577,0.325260907342323,0.97741806795415,0.605280436646073
50
+"P02262",0.634403718021837,-0.448038363602176,-0.272262963222741,1.00443083680812,0.711258047422093,0.348259465061372,0.957920753321584,0.487309870373058
51
+"P02401",-0.281624336528224,0.0288396853602522,0.0462908474194898,0.255919492168691,0.25345171334972,0.345752141952195,0.950538863951467,0.0891265655101855
52
+"P02454",0.338437850110333,-0.127109642542227,0.317063545756531,-0.146092674955367,0.480386357963096,0.407328288255029,0.997490783402258,0.283176789286114
53
+"P02466",0.258474199591911,-0.235020818855064,0.116504230587563,-0.221667369457352,0.370594766781494,0.325260907342323,0.97741806795415,0.209254989597199
54
+"P02563",0.132719981681194,-0.0248204276788611,-0.0878013057244724,0.54111733746741,0.424967281832744,0.560879542906289,0.971241888225073,0.297285440466246
55
+"P02564",-0.100804546601967,0.108186820048143,0.189118066051976,0.0358152974969404,0.337316546321382,0.485660061544714,0.957920753321584,0.488299273705943
56
+"P02650",0.36889227499973,-0.367270756850313,0.374235695622758,-0.391011537410524,0.328158428420226,0.125010900312924,0.997490783402258,0.0763365314116102
57
+"P02651",0.255186954635096,-0.405104504421217,0.20461829078882,-0.185498799409034,0.327413168308783,0.291503542691082,0.992876863671889,0.269459979861014
58
+"P02680",0.185371803937773,-0.250007827828139,0.940666741620006,-0.304829007822909,0.426832118421346,0.40287028068416,0.819090345107141,0.245081033010484
59
+"P02767",0.21946946515209,-0.197931319671492,0.217329379646477,-0.4285680772171,0.365694228702209,0.357678357316713,0.997490783402258,0.123735928888642
60
+"P02770",0.000191143156476337,-0.000878365378119771,0.263458048045439,0.0748346585043917,0.393909977222449,0.637855641761793,0.957920753321584,0.559076722327014
61
+"P03889",0.116974239659235,0.141631988768692,-0.065295424525486,-0.248871452360249,0.152651463477953,0.608705044638113,0.957920753321584,0.122204942930171
62
+"P04041",-0.0302514207256867,0.0359734503702309,0.117539255864321,-0.00943546138226513,0.194960208450146,0.568422303652732,0.957920753321584,0.584880522824146
63
+"P04166",-0.278958696084008,0.087597690843841,0.0180034630007883,0.207537633622145,0.299568544518708,0.407328288255029,0.957920753321584,0.215026628220936
64
+"P04276",0.0495045786164653,-0.231690340413403,0.55414866755197,-0.195432754509728,0.344082815489009,0.434953718301071,0.903546702696569,0.374920324044374
65
+"P04636",-0.031664557294547,0.103765546309941,-0.0906720367115478,0.313913018097708,0.230119554323036,0.492940692538206,0.97741806795415,0.165851107012955
66
+"P04639",0.175933073527425,0.120854541168473,0.116582331044807,-0.277718278768767,0.351424840152012,0.59983541821887,0.980353676945748,0.209441619140238
67
+"P04642",-0.023804042095575,0.0587555256595214,-0.0175471197508901,-0.203314769174252,0.153203747735552,0.508554095922091,0.997490783402258,0.240841381271657
68
+"P04692",0.282950965401221,0.215917452275351,0.068058775151039,0.327266096556781,0.354500656546606,0.598585643831981,0.957920753321584,0.578993363151905
69
+"P04762",-0.639400992456407,0.385561840080833,-0.300239578588207,0.26432707941632,0.279409075152459,0.028937065065633,0.950538863951467,0.0328313139530219
70
+"P04764",-0.142833012945679,0.111151434450478,-0.141138200842884,0.483554927155849,0.310492865034902,0.434953718301071,0.997490783402258,0.0980962266174926
71
+"P04785",0.0510228926937817,0.170830318433949,-0.283337340990788,0.011082471384603,0.268167731421067,0.53847284599694,0.950538863951467,0.569492605639837
72
+"P04797",0.0887170206798613,0.0380900989951458,-0.0412153436919959,0.289037765749511,0.234917600932009,0.596241996875828,0.971241888225073,0.328517779147621
73
+"P04897",0.111537785425383,0.137661690713627,0.0572437365493382,-0.255290341493611,0.164691040763109,0.608705044638113,0.97741806795415,0.132807085669857
74
+"P04904",-1.08428905922184,0.2516386306613,-0.932318316847417,0.679075591712409,0.597001543142596,0.125010900312924,0.97741806795415,0.0489465453884627
75
+"P04906",-0.101185861257556,0.0301359594908731,0.00516874606116707,0.137376012969574,0.217171509694347,0.489698419507034,0.97243804926483,0.256821573166586
76
+"P04937",0.466133575784643,-0.536110937720518,0.586407141895164,-0.387667302458528,0.260605613626924,0.0285929182498678,0.97243804926483,0.0321736625485108
77
+"P05065",-0.0396965456633879,0.185354049872924,0.0181741705326934,0.216211276931593,0.198204794013196,0.357678357316713,0.97741806795415,0.209441619140238
78
+"P05197",-0.0872743099565655,0.150521442153472,-0.0488437445121135,-0.023994154708463,0.172177362411483,0.325260907342323,0.97741806795415,0.499605056713927
79
+"P05503",-0.379946460259175,0.255802660506348,0.117131738425085,-0.0132019802997717,0.141692429521852,0.0433968503708084,0.819090345107141,0.107046324800176
80
+"P05508",0.246849014422569,0.0819864084940413,0.0856564758258207,-0.308063297464195,0.241949249627122,0.47111847402825,0.957920753321584,0.0765638705345917
81
+"P05544",0.396724234619899,-0.29196426276507,0.394900916553224,-0.488439194639141,0.271158689325655,0.0908177786930757,0.997490783402258,0.0321736625485108
82
+"P05545",0.212496810914514,-0.266109926878252,0.371339800208419,-0.481097713083647,0.270593286829505,0.221188634503905,0.964251593750883,0.064042123587292
83
+"P05708",0.0712753369346463,-0.0194665965738031,-0.269710853252398,0.0736268637859693,0.181599483309549,0.515983618467807,0.819090345107141,0.610380489483012
84
+"P05765",-0.114731275522914,0.0915811073365358,0.0726764858541462,-0.0685548722603846,0.145445390844338,0.362756759875021,0.957920753321584,0.535541902324044
85
+"P05964",0.0332937038165775,-0.114485966244566,0.0403980436540295,-0.0106787436593289,0.234654245502122,0.515750735398852,0.997490783402258,0.569492605639837
86
+"P06399",0.020849864785957,-0.380435646667656,0.864595192845171,-0.282923779377444,0.441837848459476,0.412965080232456,0.819090345107141,0.381517973350726
87
+"P06685",0.0817475658378645,-0.000449221451583932,-0.0461631901374201,0.026987656125326,0.152932913829441,0.508554095922091,0.957920753321584,0.500936580243227
88
+"P06761",-0.16554277515129,0.105938158050348,0.0227448556334085,0.11196932274482,0.274418545428962,0.407328288255029,0.957920753321584,0.283176789286114
89
+"P06866",0.252500902408787,-0.557357199472937,0.84588307336373,-0.477309428203495,0.405676078160631,0.161088557238706,0.903546702696569,0.123735928888642
90
+"P07150",0.182066970645267,-0.164026377660558,0.0205057424968387,-0.058783192542641,0.374272086599912,0.40978238924968,0.972814020461651,0.392369017570403
91
+"P07335",0.114170328589556,-0.262333925724104,-0.0717500608388737,-0.158136024052606,0.236313783587822,0.274938185187905,0.957920753321584,0.244654667188857
92
+"P07340",0.291749292444974,-0.00299918104841012,0.12406457548334,-0.266807900534878,0.2014231053578,0.315093022612038,0.957920753321584,0.0540995905403294
93
+"P07483",-0.241687641022908,0.227081789877111,-0.0830446905817952,0.711126243661468,0.400034800344749,0.352720197734958,0.977195379708207,0.0744659330693581
94
+"P07632",0.169931030045068,0.12085601485047,-0.0133925329709955,-0.265462893037314,0.162238160694862,0.581283364937698,0.957920753321584,0.060098063610584
95
+"P07633",-0.0623282818509491,-0.12707287560686,-0.0775505202810161,0.055828452767752,0.231543103366831,0.585657604272495,0.997490783402258,0.44954313993701
96
+"P07871",-0.350893731945357,0.413903219249422,-0.129441638743828,0.226437725190671,0.256201260917331,0.1264713752417,0.957920753321584,0.132807085669857
97
+"P07872",-0.911924274804368,0.127557499451368,-0.0935209791414269,1.00203978397419,0.412015595018537,0.0919322308911151,0.819090345107141,0.0102408310273446
98
+"P07895",-0.0109024471636147,0.00963190731061277,-0.28557351609473,0.115702111131183,0.20083666681797,0.609636225052588,0.950538863951467,0.396461326493447
99
+"P07943",-0.0660780069215224,-0.0307219453807491,-0.152414937241644,0.0216991190746215,0.185304083763678,0.598585643831981,0.97243804926483,0.464194763525085
100
+"P08010",0.784427286366088,-0.539811768314249,0.163306572174429,-0.269081191855136,0.251758577215056,0.00878134161288728,0.819090345107141,0.0129949088694208
101
+"P08050",-0.217681738950132,0.379652304704483,-0.101072355573021,0.0889935145544797,0.185889888896792,0.0425742156998337,0.957920753321584,0.139440113408161
102
+"P08461",-0.0688618900192092,0.122747329961771,-0.210313765008959,-0.0642013883920168,0.143874003506542,0.325260907342323,0.957920753321584,0.605280436646073
103
+"P08503",-0.221547981779458,0.175594997896988,-0.211693489819959,0.265272878254874,0.158260213879398,0.0924290694201828,0.997490783402258,0.0407768510768906
104
+"P08649",0.109653648571726,-0.425221271337655,0.506850447473457,-0.339626047882288,0.350151202500917,0.301976793663223,0.957920753321584,0.211382157622106
105
+"P08733",0.0936846238540897,0.0948631356254214,-0.109876532992339,0.353562905782887,0.337140988833674,0.637855641761793,0.957920753321584,0.350634504220609
106
+"P09006",0.101034758492712,-0.00311793968488083,0.318273303787917,-0.027923880428238,0.29825383549643,0.565390618154266,0.957920753321584,0.483281914594201
107
+"P09456",-0.154200875326111,0.0737080628929973,0.100919588853481,-0.016779465601095,0.212122423653372,0.374322083347125,0.957920753321584,0.391712537169095
108
+"P09605",-0.088752483554857,-0.29456783518691,-0.0324411741661773,0.49824929831072,0.275321782223449,0.453446509386977,0.97741806795415,0.0891265655101855
109
+"P09650",0.028062630676775,-0.302681731368783,0.206403990318606,0.0477082124661312,0.477819200601233,0.504600917353787,0.97741806795415,0.605280436646073
110
+"P09812",0.0185742493229636,0.0465443916668965,-0.0220817715599828,-0.183775822729634,0.131022855014337,0.596241996875828,0.97741806795415,0.160160119821098
111
+"P0C1X8",0.105509645793216,0.038171558482342,-0.0097670801142856,-0.0507117170250949,0.181654665506932,0.581283364937698,0.97243804926483,0.381517973350726
112
+"P0C219",-0.150796048719091,0.197338826400692,-0.0256546924309108,0.0335650833353994,0.18130389682601,0.179075442758738,0.957920753321584,0.282429104692376
113
+"P0C2X9",-0.0825413643586166,0.127253922752496,-0.0452295836441883,0.0510044784353929,0.203912285084327,0.398304585638883,0.977873118298874,0.39136272058544
114
+"P0C546",0.024953004959174,0.250155857343362,-0.0666278763347483,-0.061493397601641,0.146537998077452,0.347171085234845,0.97243804926483,0.464194763525085
115
+"P0CG51",-0.152130487576008,0.0675699917921923,0.107766278972929,0.176474997856093,0.246792985729042,0.463988989372019,0.957920753321584,0.273042879602516
116
+"P10111",-0.137336176780482,0.0551978582081807,0.0712242684530453,-0.0205848527665473,0.216426607262482,0.416633462432652,0.957920753321584,0.436620827130257
117
+"P10536",-0.104995836881405,0.0298471250056705,-0.0115908901012179,0.107079320450667,0.297189707555164,0.534682901519104,0.97741806795415,0.374868316597756
118
+"P10719",-0.272573649534704,-0.000103873765087058,-0.289330562543523,0.164941666675455,0.19203439280854,0.325260907342323,0.997490783402258,0.0765638705345917
119
+"P10760",0.116401114768642,0.171907877340486,-0.10647121441954,-0.125792484978763,0.171935277302598,0.589565065830188,0.957920753321584,0.256365345858665
120
+"P10860",-0.172049417329365,0.273264151807319,0.0103717309462923,0.23172941302428,0.196657888239026,0.125010900312924,0.957920753321584,0.0941033828553605
121
+"P10888",-0.230363466707851,-0.0867200581601461,-0.250961343655952,0.166753328249341,0.162213860229792,0.416633462432652,0.992876863671889,0.0716368981257204
122
+"P10959",0.403979242083335,-0.893409342066879,0.61363059060895,-0.08315713825892,0.210658021618134,0.0283025516459078,0.957920753321584,0.125560228456648
123
+"P11030",-0.356669953802534,0.240831846291031,-0.258754160100222,0.773205340213585,0.47686016957025,0.341690669446298,0.97741806795415,0.0744659330693581
124
+"P11232",-0.306842657668086,0.284786892428115,-0.152348392363962,0.243840311989369,0.230435760295776,0.0899975496437548,0.957920753321584,0.0744659330693581
125
+"P11240",-0.629784527948218,-0.159052156542197,-0.277453685984386,0.516321136961638,0.323386159989858,0.317364875524308,0.957920753321584,0.0237390710333568
126
+"P11250",-0.0237318609891983,-0.0206351063350345,-0.0166565350148209,0.0526325928511012,0.197511001181391,0.637855641761793,0.997490783402258,0.491324677858505
127
+"P11442",-0.206597176996378,0.0449261195822753,-0.0851583554090942,0.174338308638038,0.29089321927983,0.428581775723703,0.972814020461651,0.207949101565345
128
+"P11507",0.136305546230623,0.104225224065688,0.103347047659093,0.053899067408419,0.154232696512288,0.596241996875828,0.97741806795415,0.437813644411442
129
+"P11517",0.307836040368093,-0.82901660702708,0.645191968274574,-0.0516347580177317,0.534965710360633,0.136430744968999,0.957920753321584,0.388661422725883
130
+"P11598",0.0199792823314415,-0.0599968900577313,-0.04362173021339,0.0842687507669646,0.332406955489998,0.596241996875828,0.97741806795415,0.559076722327014
131
+"P11608",-0.502763679708773,0.227640257594383,0.0490564795396749,0.273329661797073,0.45681163117876,0.341690669446298,0.957920753321584,0.205534360762575
132
+"P11661",0.0305336881194652,-0.103264872173027,-0.0705436939555602,0.00812075605941263,0.230440808387703,0.492940692538206,0.972814020461651,0.588524633787368
133
+"P11762",0.0719387509772378,-0.094400049447385,0.194943680332176,-0.323165309406257,0.239769790561518,0.469211431075543,0.97243804926483,0.139440113408161
134
+"P11884",-0.0846835359014457,-0.00460943549555166,-0.00990795046002123,0.178274413909138,0.242422212969378,0.571075870553267,0.97741806795415,0.259814917459146
135
+"P11915",-0.680719770747093,-0.0489027155104638,0.0888114143694927,0.68363538403994,0.182208038358425,0.0359296042085271,0.176363367659687,0.000616199713127906
136
+"P11951",-0.258127422872055,0.114737083831613,-0.0130289415419213,-0.0506396898755011,0.270355817590323,0.325260907342323,0.957920753321584,0.351079678355629
137
+"P11960",0.0790374293733807,-0.11463773629982,-0.000422246175056644,0.0742474960896947,0.147685740100574,0.327977186925337,0.971241888225073,0.605280436646073
138
+"P11980",0.0441667256099245,0.00267997935156504,-0.11605020778263,0.106181855197952,0.155892717331616,0.588913159577423,0.957920753321584,0.488767759533134
139
+"P12001",-0.0136169563413658,0.126344365370128,-0.0301989282182919,0.237337436001935,0.234319939398238,0.491817426946006,0.997490783402258,0.265570705967277
140
+"P12007",0.123280889034844,-0.17546865068805,0.0383612132228901,-0.0484435268238603,0.136159281080525,0.126937811696171,0.957920753321584,0.215695483857355
141
+"P12075",-0.248920563660462,0.0869506646136158,0.0723517349293147,0.362978639638814,0.196003574506296,0.237893398335322,0.878686589410386,0.0384240906030656
142
+"P12346",0.246635760706887,-0.357088808174981,0.544500842939541,-0.312779310841489,0.377572490308958,0.274938185187905,0.957920753321584,0.170477334798134
143
+"P12368",0.330850229941927,0.0184238686364661,-0.1462102739847,-0.332172886238468,0.193383739736403,0.339042678359112,0.819090345107141,0.0694062540106815
144
+"P12749",0.273646240352939,0.217096028378472,-0.263181058589207,-0.290816916020002,0.207193969890642,0.596241996875828,0.819090345107141,0.0942091856734744
145
+"P12847",-0.392556744849901,-0.0906551001062384,-0.414580479830823,0.516583083384624,0.731340326222551,0.543615917443689,0.997490783402258,0.220251596432954
146
+"P13086",-0.136855046027399,-0.0834529949133362,-0.190366473187962,0.32660538418191,0.271368100091015,0.598190127875211,0.97741806795415,0.132807085669857
147
+"P13221",-0.128663103663448,0.0154560459521526,0.0808035601580953,0.280323994354343,0.278178004783046,0.512699410527593,0.957920753321584,0.171745797999644
148
+"P13437",-0.485375777077222,0.554957506304295,-0.350717512630513,0.796942063056018,0.366144575942428,0.0602412100600652,0.97741806795415,0.0237895116480149
149
+"P13635",0.120611558736757,-0.399248253993405,0.551846853986343,-0.280157120741704,0.355108861939931,0.315093022612038,0.950538863951467,0.25249215237515
150
+"P13697",-0.420947860007838,0.328096210705741,-0.249515515314902,0.395995200903629,0.260934029478646,0.135115517829601,0.971241888225073,0.0765638705345917
151
+"P13803",-0.179300320365004,0.0885801126638433,-0.120752196237789,0.22602052468241,0.154778847529781,0.231919659730304,0.97741806795415,0.060098063610584
152
+"P14046",0.5150662723252,-0.566683439216308,0.600688141701538,-0.464500468918537,0.574534931174532,0.190491256156962,0.986313879726913,0.132807085669857
153
+"P14408",-0.0412168001702244,0.103533406542873,0.0291723355168205,0.22653532791195,0.169916801054184,0.431289321240626,0.972814020461651,0.155858652991753
154
+"P14480",0.0708244360212675,-0.267367608352348,0.972128552107097,-0.278779902762028,0.447908761975035,0.453405134848688,0.819090345107141,0.349123001545045
155
+"P14604",-0.203995961956315,0.0770241614566922,-0.000496054845815679,0.169561258555445,0.177493100406611,0.276779006767555,0.957920753321584,0.0891265655101855
156
+"P14668",0.00377552092379767,0.0881090308406821,0.0490993368135781,0.128911194699243,0.199341307126786,0.538760865969149,0.97741806795415,0.396461326493447
157
+"P14669",0.145717246005706,0.152068495332342,0.0344377826287467,0.00762187711146161,0.210783847373884,0.635337247961281,0.971241888225073,0.39136272058544
158
+"P14882",0.153803084889014,0.000609603683157391,0.117581101453178,0.061025553208566,0.185068613109884,0.434248904899827,0.97741806795415,0.452555124527368
159
+"P14942",0.0686218812880996,-0.22308631674089,0.145313153941945,0.0652137600119079,0.161915286318173,0.216732968497609,0.97243804926483,0.60982603174541
160
+"P15429",0.27723157275634,-0.227704685418878,0.260944123093672,-0.274218286901399,0.22554031570296,0.125010900312924,0.997490783402258,0.0716368981257204
161
+"P15650",-0.129653337360056,0.183109609834567,-0.117389104111856,0.514361686547646,0.309849123049804,0.406360587730284,0.997490783402258,0.0916047581466309
162
+"P15651",-0.126818800447864,-0.0914808013598537,0.0118041281937655,0.164083262157567,0.191210185799526,0.598585643831981,0.957920753321584,0.163610083550733
163
+"P15800",-0.177561027860023,0.148738747712995,-0.210108527936658,0.183756891828518,0.241288043673101,0.325260907342323,0.990892502664508,0.165851107012955
164
+"P15865",0.0584631071533201,-0.200519690893968,-0.0595042029043063,0.0366866006306659,0.198368305400569,0.327977186925337,0.959899287147676,0.584103287358218
165
+"P15999",-0.284009436410651,0.0189979234202817,-0.305369161002547,0.431156505591381,0.306697990543701,0.407328288255029,0.997490783402258,0.0751998617587561
166
+"P16036",0.140056408868683,0.25458053868939,-0.200945045222845,0.142370913108836,0.187425133795208,0.487786580787464,0.819090345107141,0.610380489483012
167
+"P16086",0.120691278727492,0.162952046741529,0.0043645963735936,-0.0643586526885724,0.160382323843594,0.5893339024009,0.957920753321584,0.244654667188857
168
+"P16290",0.113093424386063,0.0353900753167018,-0.225263880315919,0.291417743112408,0.26628928301697,0.582589321847809,0.950538863951467,0.388661422725883
169
+"P16303",0.432131425363026,-0.28692652952298,0.387881126536269,-0.586232756131293,0.343121131892782,0.274794102390614,0.997490783402258,0.0819707183741774
170
+"P16409",-0.0678171670888743,0.0332040320401241,0.104452975854735,0.345233842007228,0.195756847270373,0.512854587296081,0.957920753321584,0.0891265655101855
171
+"P16617",0.117373918089261,-0.0196847776088709,-0.0720416916383038,-0.0296111150417086,0.148630617266182,0.40978238924968,0.950538863951467,0.289281508678609
172
+"P17074",-0.0477332948440103,0.100627220907379,0.036633611466003,-0.0467360340394699,0.149856906071595,0.407328288255029,0.971241888225073,0.612003551252753
173
+"P17475",-0.0319841170926873,-0.291197551300666,0.455791287664058,-0.0256526089779825,0.326602289203751,0.440702476368183,0.903546702696569,0.60982603174541
174
+"P17702",-0.0398769916099723,-0.016064533940489,-0.00640469667281339,0.0130519535860498,0.127501308323949,0.598585643831981,0.97741806795415,0.487309870373058
175
+"P17764",0.0916569621717584,0.136670662191782,0.0322409606788496,0.132242308350692,0.210269896150867,0.596241996875828,0.97741806795415,0.559076722327014
176
+"P18163",-0.315173257156917,0.284548472481365,-0.244857585997375,0.368674512344916,0.188247409856275,0.0425742156998337,0.97741806795415,0.0230980246095781
177
+"P18266",-0.719305426791133,0.303072613125903,0.0835948065514056,0.303042328971529,0.338789885188705,0.125010900312924,0.819090345107141,0.0790367139964415
178
+"P18292",0.010788248597992,0.139680596678921,0.100681015973054,-0.438127034606603,0.292116814194063,0.5650320912287,0.97741806795415,0.232327541850712
179
+"P18418",0.0758345686044068,0.0343789836567819,0.152212729056841,-0.169053541791608,0.175308644946117,0.596241996875828,0.972814020461651,0.190193064588659
180
+"P18420",-0.0600950569380459,-0.0144672451670467,0.0171437342691703,-0.0889696801668765,0.124533319364428,0.560879542906289,0.957920753321584,0.547251708713505
181
+"P18421",-0.047888552529568,0.0617552197782214,0.0213356850190183,-0.100009962951359,0.136803027705626,0.483603738206818,0.974147078516161,0.517889150684254
182
+"P18422",0.0343736896990618,-0.0475821111235124,-0.00504762058077235,0.0518333600280727,0.150402634414318,0.538486115262159,0.97741806795415,0.588524633787368
183
+"P18886",-0.565447267594612,0.526596349357957,-0.362265292042285,0.430162098893208,0.152662476379082,0.000998431054231418,0.950538863951467,0.00117196443507865
184
+"P19234",-0.0193418627519742,0.112752416556931,0.0852285460369167,-0.144656696180952,0.182679111954935,0.463988989372019,0.971241888225073,0.381517973350726
185
+"P19511",-0.214558325458747,0.114613557344567,-0.201909590368514,0.548189952878969,0.362464542816269,0.412965080232456,0.997490783402258,0.0891265655101855
186
+"P19804",0.108304304808403,0.0014857684657128,0.0227031558850937,-0.184547155908182,0.151455630786817,0.463988989372019,0.971241888225073,0.10801258217793
187
+"P19945",-0.13073166520646,-0.133180016962118,-0.0605583932519887,-0.04160886834178,0.291149353940945,0.637855641761793,0.97741806795415,0.517889150684254
188
+"P20059",-0.00551844479438578,-0.298462071557956,0.529294323744344,-0.20769889980732,0.371697360682482,0.441130691956013,0.919788738238822,0.434816831820375
189
+"P20070",-0.0358610879991024,-0.141646790285745,0.0945566151384191,0.0151781952588392,0.144069169967653,0.492940692538206,0.957920753321584,0.524987652945309
190
+"P20280",0.0947202202456556,-0.032897330463596,0.0482963748423029,-0.0799184725946376,0.154990395694741,0.481596238104337,0.97741806795415,0.317197505516124
191
+"P20759",0.101147643140758,-0.522659300369462,1.06999248353912,-0.776831102378221,0.398144118241494,0.345752141952195,0.819090345107141,0.134693095712378
192
+"P20760",-0.252719348671858,0.00917434116927367,0.474544888220331,-0.520945533294435,0.404765742405264,0.481627492130943,0.819090345107141,0.39032433850304
193
+"P20761",0.351049112081868,-0.112189798852728,0.0896426101463485,-0.269883222872762,0.398325718896013,0.40978238924968,0.971241888225073,0.226004534453422
194
+"P20767",-0.302676328350981,-0.244726525695835,1.08096947154055,-0.557247289699767,0.332220289347007,0.608705044638113,0.819090345107141,0.401099197211147
195
+"P20788",-0.143940806293258,0.00437468075930723,-0.13490738492637,0.0854062704326003,0.135217646177128,0.371120059621398,0.997490783402258,0.132807085669857
196
+"P21396",-0.432707719302388,0.492490918246559,-0.51988238583189,0.593911299403538,0.436879627716548,0.136569581868594,0.97741806795415,0.0744659330693581
197
+"P21533",-0.025115627641155,0.189751845565351,0.08309168017299,0.0619811865159959,0.231024546305439,0.40978238924968,0.97243804926483,0.495612994621804
198
+"P21670",0.04601237719887,-0.0324036890883276,-0.00667006296897323,0.0483431320241338,0.207714722278305,0.560149268002283,0.97741806795415,0.610380489483012
199
+"P21807",0.358477711396114,-0.557510222419626,0.107670638784385,-0.0323840217208671,0.37876067870552,0.20898846371069,0.971241888225073,0.339824746690888
200
+"P21913",0.104973235736739,0.000601768400491335,0.0909524044901231,-0.0546758934935349,0.154904013560093,0.475311806869099,0.997490783402258,0.277865663398613
201
+"P22062",0.28326589884955,0.00367864811015314,-0.0884421853825021,0.170922740964837,0.185641978028902,0.307141575074799,0.819090345107141,0.403899664587554
202
+"P23514",-0.07855938073529,-0.0405988668198543,0.0090627729369399,0.15672497333364,0.358574977781783,0.610896705569227,0.97741806795415,0.442075067554739
203
+"P23562",0.245509354479846,-0.629024227353695,0.476842893845161,-0.176300050535785,0.431175809434128,0.154459571326144,0.971241888225073,0.292207117166307
204
+"P23693",0.0185185973838917,-0.0215147670060624,-0.111900607132577,0.334700033388536,0.354515271999292,0.608705044638113,0.97741806795415,0.317375107007679
205
+"P23764",0.671478489606135,-0.434552186763678,0.348911157447349,-0.262156500014363,0.483910659994245,0.125010900312924,0.957920753321584,0.108118129867038
206
+"P23928",-0.341939222776495,-0.0499624550569423,-0.408880969153761,0.320046869971445,0.464307677688678,0.484398669737553,0.986313879726913,0.18284025556653
207
+"P23965",-0.371535984614108,0.050350636626635,-0.217282001837407,0.245958115592225,0.180387812481931,0.120013628684448,0.957920753321584,0.026593548950358
208
+"P24049",-0.171008404362073,0.0757504340778494,0.0100219969933149,0.0730839611304908,0.245618934328709,0.406711609787598,0.957920753321584,0.287706609562578
209
+"P24090",0.318074888961627,-0.279884410809649,0.267439614612166,-0.425071967455676,0.329894377559958,0.216132560078548,0.986313879726913,0.0782408485856636
210
+"P24268",-0.187334081650536,0.0623936110844113,-0.0603293971794497,0.0961417969206417,0.215679370537839,0.35272227389075,0.964251593750883,0.207581829053658
211
+"P24329",0.0725133022805312,0.0127623523386014,-0.0256193461081734,-0.00980839050609066,0.20528115302625,0.582589321847809,0.97243804926483,0.488767759533134
212
+"P24368",-0.132834366748243,0.0255599520224544,-0.0113161967383081,-0.0165579833044543,0.229913652310696,0.469873819275444,0.971241888225073,0.450773233550906
213
+"P24473",0.0501493154856203,0.076034243659452,-0.160158581308552,0.152832098276057,0.154803804740828,0.59983541821887,0.950538863951467,0.39032433850304
214
+"P25113",-0.018109189144421,0.0617993924118337,-0.199351540343727,0.171572040539499,0.292607864299077,0.586502955947616,0.957920753321584,0.391712537169095
215
+"P25886",0.0699509458771958,0.0587859691686995,-0.110183581073044,0.0145250443408733,0.166443676466291,0.619056834796519,0.957920753321584,0.509105379870124
216
+"P26284",-0.0760036868243887,0.272295913720653,-0.106836586326372,-0.0111542664015214,0.151604535676595,0.125010900312924,0.97741806795415,0.484214657935653
217
+"P26453",-0.230239856908045,0.233795285994165,-0.125997593500662,-0.0596222744241582,0.151913175523541,0.0467295043596072,0.957920753321584,0.253311818271208
218
+"P26644",-0.0566032145126095,-0.019661589051093,0.354999480242671,-0.306998867412133,0.253800159522317,0.608705044638113,0.950538863951467,0.348371307395813
219
+"P26772",-0.227331200379143,0.0382325912614783,-0.31421634555016,0.446858654679928,0.28742552480248,0.40978238924968,0.97741806795415,0.0744659330693581
220
+"P27139",0.200655171666735,-0.521761929443047,0.567142949403504,-0.178791200969721,0.336745259731098,0.135115517829601,0.957920753321584,0.25249215237515
221
+"P27321",0.063035780048684,-0.0506576159013164,0.150772882750497,-0.149553664364953,0.171958885498468,0.508554095922091,0.973579190139281,0.292207117166307
222
+"P27605",-0.0749155529193888,0.161333264150133,-0.0245760153568304,0.0538758655162687,0.203679084131107,0.35272227389075,0.97741806795415,0.396461326493447
223
+"P27791",0.39380578777217,-0.056205125406244,-0.0876632477321992,-0.410128308466991,0.273946043388866,0.264785964953857,0.819090345107141,0.0489465453884627
224
+"P27952",0.152095519349709,0.0710490547600229,-0.164621211384702,0.0323862587605633,0.184450338679732,0.538486115262159,0.819580469110799,0.391712537169095
225
+"P28023",0.506157675475424,-0.479222586628775,-0.142617098489233,-0.140370229456891,0.412315968517152,0.114620742138943,0.878686589410386,0.15605088773605
226
+"P28042",-0.024527090733666,0.108764841860682,-0.101233762821268,0.0435153305974701,0.210531608612549,0.515750735398852,0.97741806795415,0.534540795501693
227
+"P29117",-0.089081059885177,0.0386697150361627,-0.319569512859804,0.29317005229395,0.194855516275291,0.481596238104337,0.957920753321584,0.105673076488289
228
+"P29147",0.123157325824482,-0.181355920183639,-0.0756431185750264,0.0831839863858009,0.207634141217297,0.352965111736937,0.957920753321584,0.569492605639837
229
+"P29266",-0.00899445538181413,-0.00347117673493463,-0.0900527420050234,-0.171521511038352,0.206628518459048,0.635337247961281,0.97741806795415,0.348371307395813
230
+"P29314",-0.251136809573815,0.0752009052076133,0.0190972163499422,0.153666849800315,0.341546189940637,0.408384851256733,0.957920753321584,0.237324801277111
231
+"P29410",0.0793676058486303,-0.199105877633957,-0.0538247195242978,0.266434438931612,0.209144679838318,0.325260907342323,0.957920753321584,0.317197505516124
232
+"P29418",-0.0825961841843237,-0.104548211041791,-0.387724889648307,0.491628981552449,0.24659306125731,0.610896705569227,0.950538863951467,0.0751998617587561
233
+"P29419",-0.229478393373,0.0224510223825757,-0.328895714621205,0.224929713452376,0.240038953479044,0.388963284452367,0.972814020461651,0.11205714386748
234
+"P29457",0.112930648481026,-0.015003001621962,0.217744797336453,-0.277635273856694,0.22409557281436,0.53404984079669,0.97741806795415,0.199758192329181
235
+"P29975",0.226605302221426,0.0576921704114768,-0.016917515502755,-0.262514440286797,0.137442329699852,0.407328288255029,0.950538863951467,0.064013677198174
236
+"P30009",0.741264247141669,-0.248402098159337,0.0764701013530882,-0.628390750608297,0.249082415462325,0.0602412100600652,0.819090345107141,0.0229175705846382
237
+"P30427",0.056676681382506,0.0301942328160903,0.0557239825045026,0.094726303301552,0.214288885016918,0.608705044638113,0.997490783402258,0.563373754133502
238
+"P31000",-0.030332037965354,-0.164173253990289,0.15307553817584,-0.13620351684351,0.365857694534088,0.560879542906289,0.97243804926483,0.524987652945309
239
+"P31044",0.13367432730102,-0.0179441776410433,-0.00709309668551822,0.202253942405998,0.214670089962226,0.463988989372019,0.957920753321584,0.51676367235186
240
+"P31211",-0.143473760719163,-0.0598331947143005,0.229044705001877,-0.0595423600096515,0.409134803228445,0.59983541821887,0.957920753321584,0.567880528478254
241
+"P31232",0.0398082786403701,-0.180987467558098,0.539924532122806,-0.37389627134102,0.798123222108115,0.596241996875828,0.97243804926483,0.487309870373058
242
+"P31399",0.00794839559809437,0.114913301405035,-0.0978694980309239,0.475777029193648,0.241290665715774,0.538486115262159,0.972814020461651,0.107668029451077
243
+"P32551",-0.115867942072506,0.0687816331638467,-0.123718190704706,0.103141678986619,0.155475339316338,0.34972410638012,0.997490783402258,0.18701973415208
244
+"P34058",-0.0762374288665571,0.0429551444408863,-0.0713610385626511,0.0801587534569047,0.21558191744496,0.504600917353787,0.997490783402258,0.370774642657717
245
+"P34064",-0.0095190837220005,-0.0566358011471795,0.137222777713826,-0.0667949851093855,0.166467262278708,0.596241996875828,0.957920753321584,0.528096336837935
246
+"P35171",-0.160363371296704,0.000915190846163794,-0.0413404485654563,0.0423545696193264,0.192434604882113,0.433742527282627,0.957920753321584,0.272400629926742
247
+"P35281",0.292319854607226,0.0728892612632305,-0.0996582302008799,-0.252963346775725,0.192048960501157,0.412965080232456,0.878686589410386,0.0891265655101855
248
+"P35434",-0.553356051080407,-0.0972601605137029,-0.299033663761973,0.366783072131132,0.350339523614238,0.327977186925337,0.957920753321584,0.060098063610584
249
+"P35435",-0.200494649904439,0.137588402151722,-0.0601769755016323,0.356620389267134,0.209971315794026,0.274794102390614,0.957920753321584,0.060098063610584
250
+"P35565",-0.117502890860464,0.181966063794993,-0.082052555078105,0.304602084001345,0.31790465573688,0.409300775991167,0.997490783402258,0.205534360762575
251
+"P35704",0.153327869000495,-0.297457245034306,0.223539048632255,-0.032755916432052,0.203317917936015,0.1264713752417,0.97741806795415,0.312604868307736
252
+"P35738",0.223294504740886,-0.299752342435862,0.12717839792587,-0.388011507360904,0.239943935340235,0.128844361162376,0.974638754878273,0.0650018367600378
253
+"P35745",0.0468476092432634,0.13748662444915,-0.247370945462573,0.0814852765901804,0.176029230320449,0.543615917443689,0.950538863951467,0.569492605639837
254
+"P36201",-0.213354260804221,0.0302515615055032,-0.234298502168896,0.525020977847797,0.414786144518901,0.492940692538206,0.997490783402258,0.123735928888642
255
+"P36953",-0.322027864003869,-0.00115052092343113,0.385525966778005,-0.110771572735566,0.299060052964432,0.374322083347125,0.819090345107141,0.377190117038543
256
+"P36970",0.0110756685540702,0.0482769238624645,-0.0463215656525829,0.00859906997401905,0.150686152704837,0.598190127875211,0.97741806795415,0.610380489483012
257
+"P36972",0.334464943791039,0.0596268136781806,-0.0512122348061714,-0.212546972417265,0.195547546734275,0.325260907342323,0.819090345107141,0.0528774670541718
258
+"P38650",0.222797701274757,0.156913991429159,-0.25310483906905,0.207028199139573,0.312843934962691,0.596241996875828,0.878686589410386,0.605280436646073
259
+"P38652",-0.326137084147959,0.260811805041355,-0.103857358713484,0.066722885776449,0.212487932300528,0.065834584066547,0.957920753321584,0.115925402260913
260
+"P38718",-0.0607062321851278,-0.0740369210920079,0.146471786819812,-0.422691084373102,0.247419756552406,0.625115423046112,0.957920753321584,0.171942196970947
261
+"P38983",-0.142941324637541,0.268292626280341,-0.0104795264492735,0.266717590250359,0.453762751643133,0.412965080232456,0.97741806795415,0.316183670663493
262
+"P39069",0.126028287277709,0.00923801940622523,-0.0754472792836976,-0.018045274540572,0.162641159166147,0.463988989372019,0.950538863951467,0.318623139517916
263
+"P40307",0.0619718743452001,-0.0401004435134229,0.0242549157768256,-0.150451152495186,0.16635714466407,0.516793210759087,0.977873118298874,0.283176789286114
264
+"P40329",0.130455179905243,0.023373316988238,-0.240083228177989,0.0658029976531339,0.195567240837947,0.538486115262159,0.903546702696569,0.531815255438397
265
+"P41123",-0.193991754438251,0.0733038026964329,0.0167952642132499,0.221759074732828,0.275771127914995,0.407328288255029,0.957920753321584,0.165851107012955
266
+"P41350",0.0611622064026427,0.0328262622168669,0.00233823306432631,-0.088501885375817,0.154718916217821,0.598585643831981,0.97741806795415,0.294902984430944
267
+"P41562",-0.16973942284662,0.392536287564219,-0.218937887176352,0.253509292316338,0.19142859503021,0.0568445740326501,0.97741806795415,0.0812412515423356
268
+"P41565",-0.258382662611524,0.0775029544657637,-0.0551947894653129,0.206008124237548,0.251425956299545,0.325260907342323,0.957920753321584,0.115925402260913
269
+"P42123",-0.106560832404236,-0.00478212007671665,-0.104987617584444,0.249080207949942,0.163121265984558,0.485032433795601,0.997490783402258,0.0837150914677433
270
+"P42930",-0.126302413679409,0.169952616823515,0.0729236864726207,0.204501560823498,0.387941257310557,0.450058081795936,0.97243804926483,0.328517779147621
271
+"P43278",-0.130333538521621,-0.105943464227664,0.0336697380512402,0.0816078021541754,0.253725383872481,0.61070240033399,0.957920753321584,0.336378808668975
272
+"P45592",-0.215119587385731,-0.00199341038814526,-0.0647825726607718,0.19522794684079,0.320090789142559,0.478327816133756,0.97243804926483,0.211382157622106
273
+"P45953",-0.18050887057151,0.166909713124354,-0.0731937583847317,0.0483599615467547,0.169848519887502,0.15303243554419,0.957920753321584,0.201512875408923
274
+"P46462",-0.108930852807097,0.114110276844344,-0.119179794324991,0.0816261610717502,0.161926847655849,0.325260907342323,0.997490783402258,0.240239211025789
275
+"P47727",0.12044629323986,0.0503561294544187,-0.0204884540634853,0.218179512248311,0.312518437948089,0.596241996875828,0.972814020461651,0.517889150684254
276
+"P47853",0.054021592476611,-0.413552615606585,0.89839718211845,-0.581592196583504,0.621224109877442,0.49011542370305,0.957920753321584,0.340848496230376
277
+"P47858",0.109764072192354,-0.206377862652814,0.0329136995127858,-0.152618447982062,0.164890226035373,0.179075442758738,0.97243804926483,0.153458443213571
278
+"P47875",0.198327101721669,-0.197412933366352,0.184630544951763,-0.11573425295085,0.556885115351633,0.463988989372019,0.997490783402258,0.425310515225834
279
+"P47942",-0.0178500555255632,-0.16963882458361,0.0874554752374076,0.0180276928175999,0.194070158813182,0.443147110106135,0.971241888225073,0.559843351424349
280
+"P47967",-0.18570953339299,-0.616692193545194,0.648065099737558,-0.0377112140900957,0.379395557972876,0.357678357316713,0.819090345107141,0.490350543251418
281
+"P48037",0.0845538427404256,-0.126464930349714,0.124377901065754,-0.354313528154401,0.178630979593632,0.34972410638012,0.97741806795415,0.0716368981257204
282
+"P48500",-0.122812802009808,0.13027849862958,-0.0856888588210078,0.259878990186962,0.19405630523757,0.327977186925337,0.97741806795415,0.10542131915841
283
+"P48675",-0.251787223749923,0.159046158087993,-0.15975334533689,0.453766452155499,0.332420334483034,0.345752141952195,0.97741806795415,0.0891265655101855
284
+"P48679",0.111701163052396,-0.139258834383499,-0.0154977114705001,-0.133786784461368,0.205463177681,0.345752141952195,0.957920753321584,0.233928151148954
285
+"P48721",-0.375386601577502,0.325408599450414,-0.300270610461843,0.285872235517275,0.179370754174911,0.0285929182498678,0.972814020461651,0.0229175705846382
286
+"P49134",-0.118859115334463,0.105554983314423,-0.0217421170784558,-0.068377736084575,0.185268739898739,0.408103246944841,0.972814020461651,0.553143183947513
287
+"P49242",-0.151091318588906,0.150551974568082,0.0294708618050842,0.278715994346478,0.291417930743826,0.39564346431145,0.957920753321584,0.171588602088539
288
+"P49432",-0.125158143879291,0.278987036061292,-0.0666607785028127,0.0952744615965302,0.188775075356436,0.135115517829601,0.97741806795415,0.240841381271657
289
+"P50399",-0.112057322515799,0.15474552964064,-0.0831750035357311,0.0882810624619129,0.32174548551581,0.434248904899827,0.997490783402258,0.398153342393507
290
+"P50463",-0.194058329658676,0.240474115630795,-0.0981913420234104,-0.0322615981370097,0.121553759897275,0.031067119029789,0.957920753321584,0.205534360762575
291
+"P50503",0.082004771902471,0.160860238820581,0.0531148188086091,-0.26305213505743,0.213478658453948,0.560879542906289,0.990892502664508,0.147272521430967
292
+"P50753",-0.0110714322195547,-0.00748609240458217,-0.152936777842733,0.338747249908027,0.22952975509159,0.637855641761793,0.957920753321584,0.163550856829811
293
+"P50878",0.0452725282371409,0.0032463633557618,0.0297257490582332,-0.197935758843354,0.164324320045001,0.596241996875828,0.997490783402258,0.242425323021443
294
+"P51650",0.00421816572033927,0.0655805265578303,0.0584239051741803,0.0498131926796428,0.15781323670555,0.553257435296791,0.97741806795415,0.524987652945309
295
+"P51868",-0.00839097296371607,0.0401493030518523,0.153220852256626,-0.0019860302920307,0.185292691658859,0.5893339024009,0.957920753321584,0.605280436646073
296
+"P51886",0.136746055296753,-0.0370919848831663,0.382705572010806,-0.372825512678421,0.407113717648853,0.538486115262159,0.957920753321584,0.218856059332514
297
+"P52296",0.235477158585589,-0.0112075450357946,-0.200898607699088,0.118667162829616,0.182975368327038,0.325260907342323,0.819090345107141,0.394486562989889
298
+"P52481",0.054610710817165,-0.10016637834527,-0.0480784692634827,0.0163856989022003,0.411878169386128,0.560149268002283,0.97741806795415,0.588524633787368
299
+"P52504",0.161765325994138,0.263094724246351,0.0183729438297326,-0.387574597273611,0.21736259844006,0.529520725308843,0.957920753321584,0.0667070739456433
300
+"P52944",-0.306649745744751,0.041950237636871,0.158357527634961,0.182053237333729,0.249454435688131,0.325260907342323,0.819090345107141,0.105673076488289
301
+"P53534",0.153088180304062,-0.05803079025631,0.134325008674512,-0.14150928572721,0.153704809765163,0.325260907342323,0.992876863671889,0.109225083337786
302
+"P53987",0.0516230840599778,0.262935349729136,-0.159558470831974,-0.0908501556472353,0.234685251016848,0.415453912526721,0.957920753321584,0.403705997412859
303
+"P56571",-0.0288581541626024,0.118744563570897,-0.194711879264241,0.645079397865675,0.339778568113717,0.538486115262159,0.97243804926483,0.103749075798597
304
+"P56574",-0.107138223151484,0.0348932728500746,-0.105876542473369,0.348725540318384,0.199889051088678,0.463988989372019,0.997490783402258,0.0765638705345917
305
+"P56741",0.158067562660017,0.157049507896464,0.152263842586587,0.293163169645647,0.373439732781529,0.637855641761793,0.997490783402258,0.500936580243227
306
+"P57093",-0.121030114735924,0.0368895243275479,-0.0660048234730451,0.259793466064671,0.132400304356124,0.348259465061372,0.972814020461651,0.0496529814361243
307
+"P58775",0.062336727459064,-0.0497204182555033,0.291471115951345,-0.518893186200351,0.345910993195068,0.573086632881269,0.957920753321584,0.135685642672547
308
+"P60711",-0.261463698735181,-0.108196273830321,-0.0430746567013596,-0.023387111978944,0.289726970289971,0.508554095922091,0.957920753321584,0.339824746690888
309
+"P60868",-0.37615270764492,0.137238606294247,-0.0226544395830297,0.263627743283058,0.317963132138386,0.339042678359112,0.957920753321584,0.158997471522432
310
+"P60901",0.0982891163942799,0.0520304812801814,-0.0249264221842964,-0.128098832386845,0.161450703954344,0.596241996875828,0.957920753321584,0.256666368471562
311
+"P61016",-0.274707801892092,-0.0195307216221971,-0.180996383542087,0.375608067940821,0.360740859981123,0.463988989372019,0.97741806795415,0.123735928888642
312
+"P61206",0.0385909988202267,0.0932854262298615,0.183703164686612,-0.529977487078286,0.233271043235716,0.596241996875828,0.957920753321584,0.0716368981257204
313
+"P61589",0.111761914671654,0.0890647078931086,0.0379943696318429,-0.200915859283094,0.175753289617101,0.609636225052588,0.97741806795415,0.192984731072559
314
+"P61980",0.120350671322046,-0.0610778657502898,0.0215897567588493,-0.0980729691066117,0.162581555134672,0.362756759875021,0.957920753321584,0.20222494762288
315
+"P61983",-0.295624486431863,0.0731705991104899,-0.195041809547711,0.21595678935669,0.245616602332753,0.307141575074799,0.973579190139281,0.0916047581466309
316
+"P62076",-0.139658891567469,0.207466498435026,-0.308314345143887,0.227536525610393,0.193528043592519,0.325260907342323,0.957920753321584,0.171745797999644
317
+"P62083",0.395865190086425,0.166605084427596,0.162899242372385,-0.246850022945866,0.240990152045889,0.408384851256733,0.957920753321584,0.060098063610584
318
+"P62198",-0.322625301501035,0.127005907973587,0.101659607238341,0.178046507084231,0.361475654446454,0.407328288255029,0.957920753321584,0.258714266245641
319
+"P62243",0.0538870419100327,-0.0396043677061377,0.190048048533613,-0.175207467274213,0.141964889179745,0.508554095922091,0.957920753321584,0.215695483857355
320
+"P62246",0.0101098942596507,0.0309203506466453,-0.0130036138277211,-0.0882182357835253,0.127192551620413,0.59983541821887,0.977873118298874,0.350634504220609
321
+"P62250",0.00426181563415007,-0.0352822331802207,0.115670511317456,-0.148986049613607,0.147878974318952,0.596241996875828,0.957920753321584,0.339824746690888
322
+"P62260",-0.087594853240402,0.0605578481805966,-0.0448151966338221,0.0549565867185775,0.175781000248771,0.433428565842734,0.97741806795415,0.340848496230376
323
+"P62268",-0.25131279847555,-0.0518307688322696,0.0749562397641969,0.293938115366403,0.245733567595991,0.481627492130943,0.957920753321584,0.132807085669857
324
+"P62271",0.023758188781893,0.0233402093900855,0.128566114327911,-0.114752743416374,0.179024457556668,0.637855641761793,0.97243804926483,0.399497610633803
325
+"P62278",0.583143441161775,0.119814981621946,-0.342174407457381,-0.441348655270985,0.297432922193472,0.345752141952195,0.819090345107141,0.0692367078764085
326
+"P62282",0.0693277179941944,0.0497633901371524,-0.186719066429922,-0.0953833792208577,0.16339448798774,0.608705044638113,0.878686589410386,0.283176789286114
327
+"P62425",-0.0234068200920193,0.0885148875574827,-0.100468352628262,0.00133531805145933,0.263253207260736,0.538537661665839,0.97741806795415,0.588524633787368
328
+"P62494",-0.07930237751397,-0.0199731490262248,-0.0115079886969739,0.168721935493419,0.210305834821662,0.596241996875828,0.97741806795415,0.305790140313796
329
+"P62630",-0.243955396381344,0.175658963564421,-0.292473384001654,0.042050470664742,0.499199434293756,0.433499874866858,0.997490783402258,0.420733811001595
330
+"P62632",0.0122855019611903,0.0267396769665814,-0.12393376845599,0.0180413704953907,0.142616544607072,0.609636225052588,0.957920753321584,0.605280436646073
331
+"P62703",-0.269884849039537,0.21692918865253,0.0545073330666386,0.198137630789997,0.252613461782421,0.179075442758738,0.950538863951467,0.115925402260913
332
+"P62755",0.0114018505398029,0.0952132342398867,0.0279137328078048,-0.0778240953655545,0.14047107938026,0.521699513348538,0.997490783402258,0.44954313993701
333
+"P62804",0.0454638051827822,-0.00843229807681926,0.115953028705298,0.305927368340175,0.332390902801498,0.59983541821887,0.97741806795415,0.348489720048451
334
+"P62828",0.0781317635202608,-0.024347529106052,-0.18728040414571,-0.02985234651806,0.257982814664039,0.552350536618654,0.957920753321584,0.487309870373058
335
+"P62832",0.122334963589493,0.102910880014261,0.0105058027265562,-0.10050746231291,0.160876010025335,0.608705044638113,0.957920753321584,0.192984731072559
336
+"P62836",0.0018196976019038,0.0455959588513059,0.109334184030515,0.371379586723972,0.502389147529935,0.610896705569227,0.97741806795415,0.366736748704826
337
+"P62853",-0.0512085210517908,-0.0663981413416827,-0.274878828090574,0.445762440382218,0.568613285274453,0.635337247961281,0.97741806795415,0.322431397639358
338
+"P62856",-0.0305056732285598,-0.0051328164929841,0.0359453059100699,-0.0901529810665927,0.164676660192912,0.608705044638113,0.97741806795415,0.524987652945309
339
+"P62859",-0.0651537853349445,0.196593116882473,0.128194791878327,0.00473843641557315,0.279331049102104,0.453446509386977,0.971241888225073,0.559036035164986
340
+"P62890",0.0969562774024472,0.00863530977268525,0.0347823105047514,-0.16061740049509,0.141913981529695,0.515983618467807,0.97741806795415,0.18701973415208
341
+"P62898",-0.330039869224547,-0.178697586282022,-0.807857963725164,0.744468244775248,0.611169776966615,0.595856935000949,0.957920753321584,0.125560228456648
342
+"P62902",0.170388811813106,0.248358023159952,0.157669266204875,-0.275451962807162,0.199077761780802,0.552503962675213,0.997490783402258,0.0786540978754993
343
+"P62907",-0.239869649789431,0.064294698178377,-0.136533319946094,0.116910953723179,0.328810829156994,0.40978238924968,0.97741806795415,0.259814917459146
344
+"P62909",-0.0407323463447758,0.0930358950380041,-0.0324109844091367,-0.0478870278004015,0.176519222614316,0.452865094792132,0.997490783402258,0.605280436646073
345
+"P62919",-0.0801790970365457,-0.00241195992776449,-0.022808107981259,0.0500343480572319,0.18188855655033,0.538486115262159,0.97741806795415,0.374490192626554
346
+"P62959",-0.170904958010885,0.0867865885647227,0.0668680499521387,-0.102891427183852,0.172312541676571,0.307667261111997,0.950538863951467,0.488767759533134
347
+"P62961",0.09807354104867,0.34424543076513,0.314569926313843,-0.313541189842911,0.246070914973616,0.440702476368183,0.957920753321584,0.208049092970833
348
+"P62963",-0.329817208392617,0.0834855749238748,-0.00581327861324901,0.326197885647462,0.383191228835083,0.374322083347125,0.957920753321584,0.132807085669857
349
+"P63018",-0.140252310330037,0.00137327841340457,-0.048926905999406,0.036165355762174,0.172975160889215,0.434953718301071,0.971241888225073,0.281819331496515
350
+"P63029",0.0721459542136059,0.0164200098999803,-0.166923368206993,0.0160086947081768,0.283232106879538,0.598190127875211,0.957920753321584,0.559076722327014
351
+"P63031",0.0940459489107605,-0.0142932171412783,-0.0181846670336516,-0.00454443257750003,0.152973630810159,0.463988989372019,0.957920753321584,0.392369017570403
352
+"P63039",-0.0976698748806807,0.147972256064005,-0.161960252877147,0.664150630968446,0.427556868295368,0.495476537416975,0.986313879726913,0.123735928888642
353
+"P63088",0.167228771292171,0.136560541255724,-0.0961156791922474,-0.182466622987342,0.220635037158467,0.608705044638113,0.957920753321584,0.220251596432954
354
+"P63102",-0.193563933501398,0.0710839127006844,0.0758805896201046,-0.125254221957786,0.253646758952275,0.391531640780957,0.957920753321584,0.530816770583723
355
+"P63159",0.142045884051222,-0.182033938824971,-0.129300845789996,0.0736541724596393,0.220279787155499,0.315093022612038,0.950538863951467,0.517889150684254
356
+"P63245",0.112981487368825,-0.181809298507254,0.0959220520901804,-0.00862283730216948,0.275278522817536,0.431289321240626,0.997490783402258,0.50110297284569
357
+"P63255",-0.0710479861853355,0.177305264632134,0.233869783520428,-0.204496107322719,0.245332919874649,0.437524761664311,0.957920753321584,0.481515208887218
358
+"P63324",0.0732443079384486,0.0560739329395207,0.0099642129382562,-0.122941693786273,0.140902703209602,0.6105235432667,0.97741806795415,0.25699128606491
359
+"P67779",-0.452213275855432,0.220068388330127,-0.260311626321101,0.35598965058667,0.178481532199122,0.0285929182498678,0.957920753321584,0.0102408310273446
360
+"P68035",-0.0374048540450252,-0.114807565759128,-0.185076824394444,0.53012725174377,0.486103808493622,0.59983541821887,0.97741806795415,0.240841381271657
361
+"P68136",-0.166452950950386,0.26709606463766,-0.189574363815595,0.0387095089266709,0.215179456960412,0.156858098831102,0.997490783402258,0.300341362862904
362
+"P68511",-0.0594431467710979,-0.0440946332663234,0.0378501094642183,0.18462013692675,0.251438751077723,0.621735903746648,0.97741806795415,0.294094525788948
363
+"P69897",0.104938983275586,-0.0844322506160124,-0.0807498725599043,-0.0358782491348567,0.34787980142066,0.508173358650679,0.971241888225073,0.488299273705943
364
+"P70567",-0.0557668286032085,0.165293858091421,0.104838689183663,0.0193539246058733,0.294322367158534,0.453446509386977,0.971241888225073,0.535541902324044
365
+"P70615",-0.13813840702105,0.0350530809135302,0.157977442959391,-0.193919499145919,0.267050694503182,0.481627492130943,0.957920753321584,0.556910451792533
366
+"P70623",0.0932082371748557,-0.0779094711379238,0.233903700309915,-0.16421571713477,0.249633403748804,0.470982395265471,0.971241888225073,0.277865663398613
367
+"P80254",-0.364319359989006,0.066300278109664,0.0101939098702577,0.468276103750807,0.316402299367175,0.325260907342323,0.957920753321584,0.060098063610584
368
+"P80299",-0.0886895220183235,0.189236096250215,-0.256616347225663,0.132110362388771,0.217923035917429,0.406360587730284,0.957920753321584,0.342311600819616
369
+"P80432",0.0114453452318746,0.235190248637773,-0.125278391256949,0.280040875522034,0.303710303243482,0.459485948809477,0.972814020461651,0.318623139517916
370
+"P81155",-0.0242778788253406,0.0274254078975073,-0.0889985389517057,0.297349662026672,0.186086627940715,0.585657604272495,0.97741806795415,0.132035334005002
371
+"P82995",0.0039223613378114,0.0893178314985706,0.0580359293449153,-0.297282182993756,0.158140428973136,0.538486115262159,0.97741806795415,0.171588602088539
372
+"P83732",0.0145392102009155,0.0945085997222603,-0.136133898895651,0.335371027691509,0.509934657403045,0.59983541821887,0.97741806795415,0.396461326493447
373
+"P84100",0.0700570643034158,0.0365798682410376,-0.0143130372805738,-0.0571525842486822,0.147122694602647,0.598585643831981,0.97243804926483,0.381517973350726
374
+"P84245",-0.037845361768389,-0.109161915790147,0.14596182330779,0.0257144031509363,0.204410333207949,0.565390618154266,0.957920753321584,0.517889150684254
375
+"P84817",0.262127298017756,-0.21050610778833,-0.0790631762401658,0.0474526931995095,0.170042057877853,0.147188972717366,0.878686589410386,0.286545066191089
376
+"P85125",-0.031297128238036,-0.156028002479669,-0.0527642112959901,-0.214325348873221,0.195164908062253,0.483603738206818,0.997490783402258,0.305790140313796
377
+"P85834",-0.128262385861832,0.0698648858270159,-0.0348707390570924,0.36213660686735,0.201680694954062,0.407328288255029,0.97243804926483,0.0716368981257204
378
+"P85968",-0.133441677137637,0.302173427708548,-0.162227193893146,0.0309279684716365,0.191946845752828,0.125010900312924,0.986313879726913,0.328420389912814
379
+"P85972",0.00172368670050978,0.185983617175757,-0.0126931216408242,-0.104285954698269,0.128544353362284,0.324930906950202,0.997490783402258,0.339824746690888
380
+"P86252",0.142598261492678,-0.0691116831893393,0.116205351016263,-0.182739125362266,0.148881999116611,0.362756759875021,0.986313879726913,0.135898551264568
381
+"P97519",-0.0723353920882489,-0.104985370790719,-0.309313969462509,-0.0533374755936063,0.166272084091831,0.59983541821887,0.957920753321584,0.588524633787368
382
+"P97521",-0.28480495985007,0.481842739660022,0.120972905320525,0.0815109183773243,0.264898723809735,0.0601377546587988,0.878686589410386,0.192984731072559
383
+"P97532",0.311967427263582,-0.317274253548114,-0.0813268841726143,-0.345275374185752,0.286567248136983,0.126937811696171,0.950538863951467,0.0765638705345917
384
+"P97541",-0.193523274730074,-0.110753507963397,0.0485978162092564,0.256985265826467,0.3077537824799,0.588175627968431,0.957920753321584,0.171942196970947
385
+"P97576",-0.0840745243556719,0.134024873610261,-0.130002484279572,-0.0626285455431437,0.187686311465302,0.35272227389075,0.97741806795415,0.584103287358218
386
+"P97584",0.053617459666823,-0.154253423909818,-0.056408128896735,0.203400246115088,0.205232550017345,0.437524761664311,0.972814020461651,0.415743011714011
387
+"P97700",-0.065130583628596,0.100774619726073,-0.10520883055976,-0.0382197875677373,0.178630683649686,0.40978238924968,0.97741806795415,0.569492605639837
388
+"P97852",-0.802794487673641,0.2826821876557,-0.492453176813779,0.557804258405699,0.245315909361681,0.0154175682405837,0.950538863951467,0.00351375857513962
389
+"Q00715",-0.0627449807355768,-0.0336328265434655,0.161069823295417,0.104226428692426,0.249509461800832,0.608705044638113,0.957920753321584,0.388661422725883
390
+"Q01129",0.257951655951572,-0.272560813974889,0.144929969537644,-0.158551302516215,0.376217879317846,0.325260907342323,0.97741806795415,0.256365345858665
391
+"Q01177",0.143846722365055,-0.378547820401927,-0.0953837315191725,-0.434289793080119,0.377876655062439,0.325260907342323,0.957920753321584,0.162957822053732
392
+"Q01205",-0.194829840014559,0.114693409486246,-0.0309154386230347,0.307262976384631,0.282698105623991,0.371120059621398,0.971241888225073,0.123735928888642
393
+"Q02253",-0.286145327534582,0.215751942695833,0.0259207370574627,0.229581106012534,0.193207178328484,0.0889236867896786,0.878686589410386,0.060098063610584
394
+"Q02874",-0.0908855557890415,-0.0513321398100073,0.0903806850403049,-0.115340078530623,0.176259830458898,0.599009879996124,0.957920753321584,0.584103287358218
395
+"Q03344",-0.360154275218769,0.0829728404739923,-0.468350421929666,0.667130104385718,0.363003919859464,0.345752141952195,0.97741806795415,0.0518232865313916
396
+"Q03626",0.0602643713270663,-0.17653614505873,0.026655542082083,-0.251489699938665,0.404932807704814,0.492940692538206,0.997490783402258,0.350634504220609
397
+"Q04462",0.010286887347998,-0.114498083583559,-0.0528405407924485,0.103976572083649,0.153831172704003,0.481627492130943,0.97741806795415,0.458645477042469
398
+"Q05962",0.00861195357729453,0.237394148437735,0.0482811237982991,0.870242600874662,0.655732008237997,0.565390618154266,0.997490783402258,0.207581829053658
399
+"Q06647",-0.469597071096291,-0.137743981371425,-0.474772975799232,0.178347232470604,0.397117712361219,0.433961255398653,0.997490783402258,0.143450837945898
400
+"Q07439",0.0992223445445305,0.0465333340682235,-0.178693491042392,0.0121208860960987,0.365362534908678,0.608705044638113,0.957920753321584,0.559076722327014
401
+"Q07803",0.0918721709308486,0.0561302552424161,-0.127497824236083,0.0991759990723627,0.138135127972502,0.596241996875828,0.950538863951467,0.605280436646073
402
+"Q07936",0.118661110641215,-0.0350814900476657,0.0192365850505259,-0.125899742466757,0.20033770815656,0.450058081795936,0.97243804926483,0.226004534453422
403
+"Q07969",-0.120357180986255,0.070385338034239,0.0294935410788652,0.130556930176157,0.214219812827338,0.416633462432652,0.957920753321584,0.240841381271657
404
+"Q09073",-0.0832166737837017,0.345714510489332,-0.268950668848573,0.0401770177214884,0.152259509322713,0.0602412100600652,0.950538863951467,0.340848496230376
405
+"Q2PQA9",-0.092089783493112,0.0412887213540995,-0.0864337230825686,0.0625216455286613,0.290347703064151,0.560879542906289,0.997490783402258,0.484214657935653
406
+"Q2PS20",-0.283400323548236,0.0462490797911393,-0.0403024851600148,0.257893934541523,0.302282994612507,0.371120059621398,0.957920753321584,0.123735928888642
407
+"Q2TA68",-0.101697832389437,-0.0325104522424226,-0.181456039473475,0.276185909805039,0.15210068811103,0.534682901519104,0.971241888225073,0.0694062540106815
408
+"Q3KR86",-0.172913496215303,0.150580107376378,-0.113670202358293,0.194731497430067,0.127267126262063,0.0908177786930757,0.97243804926483,0.0496529814361243
409
+"Q3T1J1",0.141907371069488,-0.292740883563635,0.380327642169628,0.186088582999972,0.246777670394582,0.325260907342323,0.957920753321584,0.571342873322414
410
+"Q3T1K5",-0.408489479655652,0.0894294042136476,0.125451087905717,0.188774296801173,0.378891629148112,0.327977186925337,0.950538863951467,0.155858652991753
411
+"Q497B0",-0.444765945922079,0.0724404907782888,0.0732405314938459,0.0354005545901048,0.254362071798841,0.154459571326144,0.819090345107141,0.11205714386748
412
+"Q499N5",0.340632561491719,0.20265063883624,0.121292398689587,-0.255365605061696,0.21938047216591,0.484398669737553,0.957920753321584,0.058144887220836
413
+"Q4FZT0",0.00956890551120405,0.174706304497036,-0.146243171522966,0.0538692175279365,0.204343222713313,0.481627492130943,0.957920753321584,0.564140230148856
414
+"Q4G069",0.198115465792201,-0.104282409065254,0.0504463417396027,-0.0388769123726885,0.181375883299226,0.254101717547638,0.957920753321584,0.208049092970833
415
+"Q4QQT4",-0.0449952839749735,-0.113907590600521,0.0823500902094894,-0.118506870371683,0.134139142092097,0.51322280633263,0.957920753321584,0.433268531411527
416
+"Q4QQV3",-0.181248002489512,-0.0773558257628771,-0.172224587441265,0.258404075007154,0.20975983429035,0.516793210759087,0.997490783402258,0.0898863574312103
417
+"Q4V8C3",0.115654532202794,0.001570435377948,0.0670114039106245,0.48454905869963,0.181207197242568,0.515750735398852,0.97741806795415,0.15605088773605
418
+"Q4V8F9",-0.210118831994612,0.344731489634156,-0.188236716437807,-0.0318924509850968,0.170543404690919,0.0425742156998337,0.992876863671889,0.274726456356024
419
+"Q4V8H8",-0.0204803105242673,0.0102342892458997,0.127234564770285,0.0552547428589489,0.223310984206562,0.608705044638113,0.957920753321584,0.507274180829343
420
+"Q505J9",0.142836370835165,0.0559774406415615,-0.386930412485479,0.454707845901633,0.429954109637523,0.59983541821887,0.957920753321584,0.416921045441866
421
+"Q561S0",-0.0108957228239191,0.16792018546784,0.0964674160517709,-0.14026346780559,0.186185540286587,0.408103246944841,0.971241888225073,0.381201352517377
422
+"Q5BJQ0",0.360628059997739,-0.349088588705847,0.192156081190528,-0.20985997214223,0.216717622658479,0.0425742156998337,0.957920753321584,0.060098063610584
423
+"Q5BK63",0.0214863493799951,0.180846126430941,0.173941055228337,-0.0684243555062853,0.227982673242565,0.466778003304264,0.957920753321584,0.488767759533134
424
+"Q5BK81",0.00308541653929196,0.110532754707251,-0.0908364333332258,0.0813675760967831,0.273294255128578,0.552503962675213,0.97741806795415,0.524987652945309
425
+"Q5I0C3",-0.0472779160210677,-0.0534095989287197,-0.0035140055659064,0.144164919701289,0.20930841726038,0.635337247961281,0.97741806795415,0.312604868307736
426
+"Q5I0G4",-0.103440977264691,0.286838096673785,-0.167953719281383,-0.0535770256661421,0.211353009893593,0.324930906950202,0.97741806795415,0.559076722327014
427
+"Q5I0K3",0.310213022356534,0.263381155152121,-0.08825522288321,-0.000629038843546,0.350724003582416,0.608705044638113,0.957920753321584,0.318623139517916
428
+"Q5M7W5",-0.0104664418156679,0.156070763213406,-0.088995573563764,-0.0473044072261536,0.147229472744613,0.357877035260681,0.971241888225073,0.537680108765885
429
+"Q5M9I5",-0.202824645450403,-0.648967793998994,0.346614640468865,0.571034235770061,0.353868245717346,0.339042678359112,0.878686589410386,0.083416193878134
430
+"Q5PPN7",-0.143997715598111,0.0949631308435487,-0.0397728637012219,0.199215618933147,0.139380941452595,0.325260907342323,0.957920753321584,0.115126139921822
431
+"Q5RKI0",-0.0878880850910979,0.0208442490696879,-0.0349531850870198,-0.00966658901721767,0.226982324877838,0.521699513348538,0.97741806795415,0.504816101618169
432
+"Q5RKI1",0.138700493907937,-0.0607259874920132,-0.229040691307075,0.0742122803019914,0.235199406079067,0.431289321240626,0.878686589410386,0.528765479736997
433
+"Q5SGE0",0.0391408925041843,0.0774230575639355,-0.0828643737058356,-0.104127259223366,0.157028983819112,0.595856935000949,0.957920753321584,0.312882490766063
434
+"Q5U216",0.145849752488821,-0.0776923037331824,0.102453930099555,-0.16521800425734,0.160064904561631,0.371120059621398,0.97741806795415,0.165851107012955
435
+"Q5U2X7",0.11830460630672,-0.105106945736436,-0.305885439929251,0.274435457382554,0.237594153386431,0.409300775991167,0.819090345107141,0.39136272058544
436
+"Q5U300",0.0405289437076637,0.0273886396916067,-0.0957935379840879,0.36529241882486,0.416809290683283,0.635337247961281,0.97741806795415,0.349123001545045
437
+"Q5XFX0",0.061616170285511,-0.049416064858153,0.118682191089537,-0.168145627485905,0.249793921712559,0.5650320912287,0.977873118298874,0.36702722914433
438
+"Q5XHZ0",-0.0858953023055647,-0.0227721966595307,-0.2277011932099,0.208351848871819,0.221980660779268,0.584826496224675,0.957920753321584,0.205534360762575
439
+"Q5XI32",0.109739093462396,0.141758949678626,-0.00225943822749487,-0.120586084470553,0.117100610544201,0.586502955947616,0.957920753321584,0.105673076488289
440
+"Q5XI73",0.00591853253318074,0.00500668145048043,-0.210632558460443,-0.0632486071632677,0.22135457226751,0.637855641761793,0.957920753321584,0.517889150684254
441
+"Q5XI78",-0.124376078272156,0.0893836744984411,-0.00530059058002343,0.0181180472675255,0.164014381312222,0.327977186925337,0.957920753321584,0.324362424432334
442
+"Q5XIB3",-0.151589969351557,0.208298938580648,-0.0471088791240698,-0.0244268569882728,0.160219055843934,0.125010900312924,0.957920753321584,0.346839913633237
443
+"Q5XIC0",-0.337891528434376,0.205070920406936,-0.297522103294924,0.265274774004693,0.188785729915961,0.0602412100600652,0.97741806795415,0.0342439356449923
444
+"Q5XIE6",0.0695644295177309,0.163780990442764,-0.0781731204676821,0.128682780212545,0.175668992099796,0.508554095922091,0.957920753321584,0.50789474354297
445
+"Q5XIF3",0.0380241214636638,0.117429453030357,0.0556078815991875,0.0422270195875991,0.136944799880337,0.492940692538206,0.992876863671889,0.605280436646073
446
+"Q5XIF6",-0.0363444312224866,0.03600835755314,-0.0653630354557435,0.17727473331706,0.167510198684375,0.538486115262159,0.980353676945748,0.213300767160145
447
+"Q5XIG4",-0.145841337164661,0.0494811566681553,-0.480621898576482,0.471021542554163,0.370363611905746,0.508554095922091,0.957920753321584,0.135898551264568
448
+"Q5XIH7",-0.415795552998992,0.171108476443754,-0.242590919314202,0.422747505910419,0.227985267047609,0.0899975496437548,0.957920753321584,0.0229175705846382
449
+"Q5XIJ4",0.000753843427696493,0.107248590276805,-0.0710932147899297,-0.0159934528726305,0.19932744857725,0.538486115262159,0.97741806795415,0.599088199428285
450
+"Q5XIM5",-0.418908280037772,-0.0298801607488847,-0.0422060652099672,0.961582623387441,0.63306825222073,0.516793210759087,0.97243804926483,0.135898551264568
451
+"Q5XIM9",0.130468804936755,-0.0519406414481868,-0.0218068481636219,-0.166068200667826,0.146593761093789,0.407328288255029,0.957920753321584,0.157342392581572
452
+"Q5XIN6",-0.182429503195801,0.345842186564719,-0.104159546088022,0.342014990285158,0.295991762240012,0.220456430479483,0.97741806795415,0.123735928888642
453
+"Q5XIT9",-0.0960998917862396,-0.104656189249033,-0.166346911476916,0.158054459501329,0.275748214434962,0.635337247961281,0.97741806795415,0.310700141660592
454
+"Q60587",-0.346515509862298,0.465308775459142,-0.153380491095991,0.713909646798599,0.266470896737454,0.0467295043596072,0.957920753321584,0.0157999418885222
455
+"Q62651",-0.269556207799577,0.313119800995702,-0.0910963073877087,0.253815417132878,0.155551977858184,0.0285929182498678,0.957920753321584,0.0285912727732913
456
+"Q62736",-0.0158313672834025,-0.173415253832204,0.309763009674694,-0.179765874944017,0.368630014312515,0.567822370573365,0.957920753321584,0.500936580243227
457
+"Q62812",0.00318481321839868,-0.0384296437589572,0.093972045080992,0.300371791359648,0.483944451924396,0.610896705569227,0.977873118298874,0.401099197211147
458
+"Q62871",0.151981357175739,-0.0309162928942275,-0.172357034719616,0.10031779119285,0.245500958521267,0.491817426946006,0.957920753321584,0.566278949946396
459
+"Q62920",0.0726961180468557,0.159945230750869,0.106647467775581,0.204283536278416,0.280679291781186,0.578653166205118,0.992876863671889,0.464991794194227
460
+"Q62930",-0.013592396192803,-0.379480033510458,0.433296884521508,-0.069851462637723,0.324811275640066,0.416633462432652,0.957920753321584,0.572118501785786
461
+"Q63041",0.112802920075589,-0.278639349871859,0.646127211380808,-0.338979392191025,0.293195665483771,0.325260907342323,0.819090345107141,0.160470218921458
462
+"Q63065",-0.0360002491100327,-0.0222935924266622,0.0593443091669075,-0.168364826172967,0.183397440113892,0.615349173448879,0.971241888225073,0.372000203828107
463
+"Q63081",0.123125310967094,-0.0131562122997881,0.184057366025962,-0.278351784639299,0.157354971044256,0.469479534736857,0.97741806795415,0.108409470836822
464
+"Q63159",-0.00855327193853883,-0.196292747817238,0.197916695742252,0.058461897130852,0.189479294147981,0.407328288255029,0.957920753321584,0.50110297284569
465
+"Q63258",-0.0034336637211235,0.139121283467612,-0.0778572050182971,-0.0626279367230777,0.170865181166944,0.478327816133756,0.97741806795415,0.527944243113092
466
+"Q63270",0.0744187076158098,0.191558041307601,-0.110375388310672,-0.0331361818533295,0.161149638371907,0.492940692538206,0.957920753321584,0.437813644411442
467
+"Q63355",0.117295700966422,-0.0443560220376224,-0.0849350792493238,-0.00531340099451647,0.195527686061344,0.434248904899827,0.957920753321584,0.396461326493447
468
+"Q63362",0.293584291831827,0.324045244042461,0.0370184681151048,-0.234262148503047,0.256887697243477,0.608705044638113,0.957920753321584,0.0941033828553605
469
+"Q63377",0.0775688206983282,0.0787897171862561,0.0029422345794692,-0.156361280529065,0.164103489792121,0.637855641761793,0.97741806795415,0.253311818271208
470
+"Q63416",-0.0996309886259674,-0.329866969951462,0.337541584695694,0.00650756973140327,0.297118219686104,0.446303426314256,0.903546702696569,0.500936580243227
471
+"Q63569",0.0707611946447987,-0.196755911906176,-0.0177286552282537,-0.0581808006057236,0.211525181064156,0.407328288255029,0.97741806795415,0.458645477042469
472
+"Q63617",0.0770818343056765,0.211383113970532,0.0863816289976761,-0.235648168570332,0.18376374883997,0.492940692538206,0.997490783402258,0.205534360762575
473
+"Q63638",0.106693901430575,0.0623189952944611,0.0294058297536164,0.123319784106551,0.337081223561825,0.608705044638113,0.97741806795415,0.605280436646073
474
+"Q63704",-0.235108874088594,-0.0161635190397274,0.0525216544566105,0.130161361992178,0.232668383932879,0.409300775991167,0.950538863951467,0.15605088773605
475
+"Q63716",-0.059435661829092,0.157410252383403,-0.0130627724258983,0.0728770041985945,0.200009055072583,0.373707710031125,0.97741806795415,0.39032433850304
476
+"Q63797",0.0940916663155482,-0.0701875546031679,0.198178712589835,-0.251530089316771,0.132404680082847,0.345752141952195,0.957920753321584,0.060098063610584
477
+"Q63798",0.061892790970483,0.0211240937047823,0.103280199562991,-0.180054418182347,0.194618979291029,0.59983541821887,0.980353676945748,0.291346442452073
478
+"Q63799",0.182358429429015,-0.021064719706813,-0.012296565490745,-0.148997144231459,0.205194934470555,0.441130691956013,0.957920753321584,0.215695483857355
479
+"Q63862",0.221034537841132,-0.339826994679483,0.50154438546362,-0.415533009834976,0.635109542592948,0.463988989372019,0.97741806795415,0.346189508796634
480
+"Q64057",0.0914092905165233,0.00412061223673976,-0.0307240203347426,-0.208234710495073,0.167032391668005,0.51073254851079,0.957920753321584,0.123735928888642
481
+"Q64119",-0.247334999456724,-0.296230085164683,0.648334227090295,-0.116917264916818,0.516027132180046,0.615349173448879,0.950538863951467,0.558834311275694
482
+"Q641Y2",-0.218031781730316,0.154550227093136,0.0686608898695319,-0.299587487853492,0.264120799719736,0.325260907342323,0.957920753321584,0.517889150684254
483
+"Q641Z4",0.0303223413505664,0.131026022130424,-0.0600040169163309,-0.10134434656466,0.150943139309387,0.508554095922091,0.97243804926483,0.381201352517377
484
+"Q641Z6",-0.0725334959566838,0.0387408624874281,-0.0216815648652832,0.128525406799278,0.221730076354496,0.515983618467807,0.97741806795415,0.31497451315001
485
+"Q642A4",-0.112413320054682,0.166828529286864,-0.0325635155982988,-0.00552262192913355,0.154498061159965,0.325260907342323,0.972814020461651,0.430401432655127
486
+"Q64428",-0.431703750422139,0.403422390142333,-0.247086791972,0.753416414362711,0.294469850880446,0.0602412100600652,0.957920753321584,0.0157999418885222
487
+"Q64536",-0.247343030524301,0.142750526777613,-0.0444597833357276,-0.0445751720929827,0.293111691947911,0.325260907342323,0.957920753321584,0.381517973350726
488
+"Q64560",0.213443971167799,-0.160015011803975,0.10025230516511,-0.152726125665147,0.141922921247183,0.165328592146551,0.957920753321584,0.107438140713788
489
+"Q64591",-0.325329658446764,0.190892265528787,-0.376989177077604,0.536906668900576,0.197057108309087,0.0871917923703263,0.97741806795415,0.0116471478580298
490
+"Q66H98",0.171757207216831,-0.14448157951233,-0.0551828100468332,-0.36478977892109,0.262856962958827,0.347171085234845,0.957920753321584,0.0942091856734744
491
+"Q66HD0",0.114869653296505,-0.0386575195925265,0.142698214686289,-0.274501461880573,0.16305732328732,0.409300775991167,0.980353676945748,0.0744659330693581
492
+"Q66HF1",-0.0311179296314646,0.167832299619358,0.081915574202924,-0.0625299117458221,0.20865991854843,0.408384851256733,0.971241888225073,0.569492605639837
493
+"Q66HG9",0.0593960217769498,-0.0156857506317772,-0.00912120097218783,0.0918124975980339,0.155653685086438,0.521636339610234,0.972814020461651,0.556910451792533
494
+"Q68FP1",0.140440699102916,-0.300811665093072,0.304947446768455,-0.182836267143853,0.248596629646251,0.22077064962632,0.957920753321584,0.209037935292553
495
+"Q68FQ0",0.369504643384294,-0.0236065351295119,-0.186845149295409,-0.149340939729799,0.325022834260978,0.347171085234845,0.819580469110799,0.152698259583665
496
+"Q68FR6",-0.269105563910301,0.138458813748338,-0.1482364992067,0.28307850545962,0.318689638054294,0.337590927483918,0.97741806795415,0.131685723524354
497
+"Q68FR9",0.169549759545857,0.149824712225892,-0.0827591009122421,-0.176731454613139,0.145273636348553,0.608705044638113,0.950538863951467,0.123658911619594
498
+"Q68FS4",-0.034707911161867,-0.0400788307632783,-0.137071554011159,0.171688164373972,0.222532001078066,0.635810645508165,0.97243804926483,0.30851937759349
499
+"Q68FT1",0.287156526963514,-0.290022315148911,0.145210285132951,-0.173353321522212,0.168345649438932,0.036342415643395,0.957920753321584,0.0572196822893149
500
+"Q68FU3",-0.202016078961507,0.134791751320921,-0.114996610896658,0.341203210194185,0.241138466530193,0.325260907342323,0.97741806795415,0.0782408485856636
501
+"Q68FX0",0.0391951122048788,0.0230452541485628,-0.0910770867431924,0.010532283988166,0.145845168685549,0.608705044638113,0.957920753321584,0.559076722327014
502
+"Q68FY0",-0.224114491606043,0.0521338839961874,-0.0696035991356588,0.300980807499583,0.234283178919817,0.34972410638012,0.957920753321584,0.0786540978754993
503
+"Q6AXS5",-0.00251099250847499,0.0530409518490617,0.0354909473881734,-0.0788676956791419,0.159255908438543,0.585657604272495,0.97741806795415,0.491324677858505
504
+"Q6AXV4",-0.281187329047307,0.16463209271241,-0.120663018368079,0.163174646577718,0.187857662567207,0.116247198756133,0.957920753321584,0.0744659330693581
505
+"Q6AY30",0.034580237832503,0.0650237124175485,-0.0820934050691543,0.0642651735226053,0.231766376547578,0.608705044638113,0.97243804926483,0.578163364281972
506
+"Q6AYH5",0.435090412529941,0.07966432914665,0.0137428028333079,-0.288343711758663,0.184134152656934,0.307667261111997,0.819090345107141,0.0528774670541718
507
+"Q6NYB7",0.022995209633579,-0.134595310048139,0.223065909510073,-0.183851648842761,0.208178256692126,0.489698419507034,0.957920753321584,0.347164840598117
508
+"Q6P0K8",-0.317129132500037,-0.0661287951609941,-0.239488640924527,-0.00310422397070291,0.334846226961805,0.453446509386977,0.97741806795415,0.305790140313796
509
+"Q6P502",-0.0700765185319331,0.0597100029481447,-0.164361395914747,-0.031494216517921,0.208556573631253,0.485032433795601,0.972814020461651,0.559843351424349
510
+"Q6P6R2",-0.365763952328298,-0.135770266434236,-0.461635630510118,0.098469760341379,0.406946114218538,0.500510889969654,0.97741806795415,0.247750292461535
511
+"Q6P6V0",-0.0505820466260013,0.180216856641933,-0.0929048711504852,0.010477216017028,0.128219595556817,0.216732968497609,0.97741806795415,0.464194763525085
512
+"Q6P747",0.634606264717164,0.111750742018765,0.0960195805230062,-0.461090552990285,0.310425789722327,0.249257850141774,0.819090345107141,0.0237390710333568
513
+"Q6P9T8",0.00173181706910457,-0.0411023853624174,-0.125211056108481,0.212005942254142,0.243493889235503,0.59983541821887,0.971241888225073,0.325899615633489
514
+"Q6PDU7",-0.0581594750957125,-0.128697405042339,-0.31436986790813,0.570353209666929,0.333047698161729,0.596241996875828,0.957920753321584,0.11205714386748
515
+"Q6RUV5",0.400137663642073,0.125924567121237,0.127799071647657,-0.32707489323681,0.175954448874616,0.345752141952195,0.950538863951467,0.0489465453884627
516
+"Q6UPE1",-0.216234805115397,0.118451898713843,-0.240616967851223,0.199656086623219,0.138013875791017,0.108594560854795,0.980353676945748,0.044936632410762
517
+"Q704S8",-0.475682040811884,0.34639045660628,-0.209765136357651,0.220871624289395,0.16416193338255,0.009014280839342,0.878686589410386,0.0129949088694208
518
+"Q71LX6",0.332975903929513,-0.0873071328520974,-0.211734066810254,0.009768712885005,0.183430771966564,0.226782686764367,0.819090345107141,0.196048394467907
519
+"Q75Q39",0.0436373382165564,-0.0333641812713753,-0.392784166680465,0.0234818483039791,0.261503418427918,0.582589321847809,0.876393208616755,0.595544019451794
520
+"Q78P75",0.380575685238502,0.145116699413702,0.153867658927672,-0.326771324483927,0.28646484967587,0.481596238104337,0.957920753321584,0.114845453148293
521
+"Q7M0E3",-0.0666230392685465,-0.314125356522315,0.135168084911518,0.199023904322208,0.223519216062435,0.419794065582696,0.957920753321584,0.305790140313796
522
+"Q7TPB1",0.0170408174722321,-0.0347453656420657,-0.138202497541189,-0.050217047968878,0.165146859218142,0.577978208921598,0.957920753321584,0.488299273705943
523
+"Q7TQ16",-0.0962107804649237,0.0635068776909806,-0.215195022655251,0.370115482374059,0.260050509278588,0.486857966071009,0.972814020461651,0.123735928888642
524
+"Q80W89",-0.292047213943498,0.199325213498273,0.246558514654416,0.0317467147357192,0.408218174029967,0.347171085234845,0.950538863951467,0.346839913633237
525
+"Q811A2",-0.315769654938086,0.118908617231235,0.0693387076994842,0.470715390817347,0.433744738043278,0.440702476368183,0.957920753321584,0.18701973415208
526
+"Q8CFN2",0.340977252274724,0.12325022919858,-0.0723590321107458,-0.0893355861025893,0.182123035365818,0.348259465061372,0.819090345107141,0.0744659330693581
527
+"Q8CG45",0.197072099858119,-0.0375762360117057,-0.0383892804406973,0.00813406914557485,0.143423420721865,0.337590927483918,0.950538863951467,0.276556948590323
528
+"Q8K4G6",0.154278322805625,-0.140098465580634,0.115259357478665,-0.0637222957836691,0.152185712264066,0.179075442758738,0.97741806795415,0.181230232429481
529
+"Q8VBU2",0.100470543885838,-0.0140682077824328,-0.0235816876507682,0.0431096056574985,0.138358819630528,0.434248904899827,0.957920753321584,0.487309870373058
530
+"Q8VHF5",0.0972709556122391,0.341968312707796,0.0169812645822434,0.408555474559886,0.319687827225061,0.450058081795936,0.97741806795415,0.293441380792057
531
+"Q8VID1",-0.150261668894647,-0.0191555600474947,0.0732043649377452,0.236434260089858,0.208196903330017,0.484398669737553,0.957920753321584,0.115917647007338
532
+"Q8VIF7",0.125205975829514,-0.135056102639293,0.16854025114902,-0.523429012272433,0.293621528448361,0.416633462432652,0.986313879726913,0.0812412515423356
533
+"Q920F5",-0.319074048190738,0.283829811206024,-0.0310686947736398,0.534698509753722,0.375519880750728,0.274794102390614,0.957920753321584,0.0765638705345917
534
+"Q920L2",0.12212451793165,-0.157319299735536,0.044672265856673,0.065249682801562,0.122729760877604,0.125010900312924,0.957920753321584,0.467415380678045
535
+"Q924S5",0.149768705244611,0.0104085034184872,-0.285457777009236,-0.0410272418727456,0.171379400150753,0.434953718301071,0.819090345107141,0.256007056497735
536
+"Q925F0",0.154232204629132,-0.0879504427357323,-0.0762658904711671,0.13466129175306,0.178218855324712,0.325260907342323,0.950538863951467,0.584103287358218
537
+"Q99J82",0.124677075788141,0.0824171467998015,0.000166998932025847,-0.0461008192402604,0.144654767592877,0.596241996875828,0.957920753321584,0.305790140313796
538
+"Q99NA5",-0.060720974019285,0.090391722985252,-0.120656349426892,0.112716891161602,0.168463991612959,0.416304346270969,0.97741806795415,0.277865663398613
539
+"Q99PS8",0.421663541100676,-0.601727218787666,0.370313892604689,-0.222646735497657,0.315107710992046,0.0425742156998337,0.982362615577186,0.0942091856734744
540
+"Q9EP80",-0.425568001235611,0.0731839172802708,0.187943164920912,0.164440919034431,0.331489424494905,0.307141575074799,0.819090345107141,0.123735928888642
541
+"Q9EPX0",0.148188262078481,0.197696266697978,-0.145330414865164,-0.227512674786346,0.164495745232011,0.581283364937698,0.819090345107141,0.0765638705345917
542
+"Q9EQP5",0.431544927772502,-0.464753450866397,0.814617596545492,-0.631588876813525,0.472140556956,0.315093022612038,0.957920753321584,0.132807085669857
543
+"Q9EQS0",0.113087819629409,0.0445552390587284,0.0073984140998069,-0.160332806207658,0.193524885509548,0.584826496224675,0.972814020461651,0.256007056497735
544
+"Q9EQX9",-0.0213676054131019,-0.0199187370084692,-0.0154369038434203,0.00603970421099233,0.130093767451954,0.637855641761793,0.997490783402258,0.556910451792533
545
+"Q9ER30",0.175864542502578,0.175680719455317,-0.1186368585086,-0.295678228033453,0.185989489987314,0.637855641761793,0.950538863951467,0.109225083337786
546
+"Q9ER34",-0.131471986378016,0.102131785592668,-0.114477410052117,0.319750132804584,0.240099507705829,0.407328288255029,0.997490783402258,0.113097537486123
547
+"Q9JJW3",-0.179665608152335,-0.0941469767094032,-0.191806365838895,0.345468038356449,0.349702206291762,0.595856935000949,0.997490783402258,0.165851107012955
548
+"Q9JK11",0.255099318130043,-0.08048885575771,-0.186361111559966,0.0859049123918893,0.3298682653429,0.402971624206557,0.950538863951467,0.449333281215939
549
+"Q9JLJ3",0.0365782238494999,0.0760386949038046,-0.0283372264929829,0.00807357917977784,0.130000629538115,0.581283364937698,0.97243804926483,0.553143183947513
550
+"Q9JLZ1",0.0479261602691578,0.0259027594009113,-0.0846242756603362,0.0319835222287955,0.187997336194601,0.61070240033399,0.971241888225073,0.599088199428285
551
+"Q9JM53",-0.161700544446256,-0.111689443679924,0.0299501834083084,0.33657030537706,0.241096852488251,0.596241996875828,0.957920753321584,0.0931041572936362
552
+"Q9NQR8",-0.0571128271970017,0.220359846179864,-0.380139727446807,0.100228592412849,0.141575731072456,0.307141575074799,0.819090345107141,0.318941896648113
553
+"Q9QWN8",0.0976316613095483,0.0753545488546268,0.097914543259296,-0.294340926746761,0.206132796447159,0.608705044638113,0.998689047167578,0.111195769876063
554
+"Q9QX79",0.829275450938882,-0.875725673841602,0.569540022223746,-0.530314851900057,0.380637361645652,0.0154175682405837,0.957920753321584,0.0237390710333568
555
+"Q9QY17",0.0839151855853442,0.124126439825986,-0.135429282562076,-0.134655785572801,0.156313272232403,0.596241996875828,0.957920753321584,0.256666368471562
556
+"Q9QZ76",-0.16441909921057,-0.334807687553423,-0.55036586882066,0.215202652096219,0.514891190019327,0.571075870553267,0.957920753321584,0.366728222331144
557
+"Q9R063",-0.0826395868810191,0.0135522309554892,-0.0656403187204826,0.169890571093946,0.176077820699952,0.508098151650705,0.997490783402258,0.181230232429481
558
+"Q9R1Z0",0.0905832074586792,-0.0027008756269622,-0.0671982794017449,0.0947652514439843,0.136513335744279,0.47111847402825,0.957920753321584,0.605280436646073
559
+"Q9WTT6",0.316414714705017,-0.373472301692985,0.346249257316134,-0.203891497448109,0.45858847463513,0.34972410638012,0.997490783402258,0.316784749619613
560
+"Q9WTT7",-0.153321925853395,0.103056951059911,0.113252584926828,-0.0492057702656754,0.279368736342835,0.411069355587278,0.957920753321584,0.497338842517326
561
+"Q9WU82",0.153688708943581,0.108387591729454,-0.0943654839361849,-0.155361440210735,0.186100500332994,0.598190127875211,0.957920753321584,0.209254989597199
562
+"Q9WUH4",-0.0967280157073127,0.127424460104433,-0.264981882534897,-0.130682298520019,0.238861446826987,0.409300775991167,0.957920753321584,0.57157494175598
563
+"Q9WUS0",0.175338083825556,-0.0875876720727325,0.061270420539585,-0.186594297673387,0.171991029755563,0.301976793663223,0.957920753321584,0.0891265655101855
564
+"Q9WVK7",-0.0518691958973162,0.00871498449626742,-0.176014130061302,0.237814931540469,0.170223305062356,0.5650320912287,0.957920753321584,0.132807085669857
565
+"Q9Z0J5",-0.0818874717406145,0.00376696052191473,-0.0761979282371975,0.160493909536444,0.136849557441232,0.485032433795601,0.997490783402258,0.123735928888642
566
+"Q9Z0V6",-0.096744780032762,-0.065290285116516,-0.16264302527036,-0.0885035486120993,0.187249545717649,0.59983541821887,0.97741806795415,0.605280436646073
567
+"Q9Z0W7",-0.123012635772126,0.0451296182105382,-0.146899090285745,0.333521063118109,0.302678170521279,0.504600917353787,0.997490783402258,0.165851107012955
568
+"Q9Z1H9",0.0900735239366831,-0.0709816269485537,0.0490394261530742,-0.106403862713797,0.150625324995516,0.431289321240626,0.97741806795415,0.277865663398613
569
+"Q9Z1N4",-0.270557333438697,0.150337406140429,-0.0826586561212286,0.20727017376872,0.270935339485341,0.345876237741406,0.971241888225073,0.196048394467907
570
+"Q9Z1P2",-0.0390405818020744,-0.0051669844891308,0.0399767722437313,-0.118456461653837,0.176546649004142,0.598585643831981,0.972814020461651,0.475148787456195
571
+"Q9Z1Y3",-0.0906889871291224,0.0924826354171708,-0.0947607465683829,0.10553133178236,0.170427315379003,0.374322083347125,0.997490783402258,0.244654667188857
572
+"Q9Z269",0.103434574314366,0.195334533477884,-0.150774677202596,-0.160290177866017,0.188391534288049,0.552503962675213,0.957920753321584,0.256666368471562
573
+"Q9Z270",0.236572096013414,-0.0712851416912451,-0.138394099607405,0.055753267125636,0.207760082960682,0.35272227389075,0.950538863951467,0.381201352517377
574
+"Q9Z2L0",0.0847357493799142,-0.0846087037971724,-0.119697010221055,0.132394694541043,0.132750404404443,0.337590927483918,0.878686589410386,0.500936580243227
575
+"Q9Z327",0.227841160342377,-0.10940519950932,-0.0669821506930981,0.00499490638537714,0.164164606269244,0.152284449248514,0.819090345107141,0.199758192329181
... ...
@@ -23,6 +23,104 @@ erf <- function(x) 2 * pnorm(x * sqrt(2)) - 1
23 23
 erf.inv <- function(x) qnorm((x + 1)/2)/sqrt(2)
24 24
 
25 25
 
26
+#' Determine individual fuzzifier values
27
+#' 
28
+#' This function calculated the values of the fuzzifier from a) the dimensions 
29
+#' of the considered data set and b) 
30
+#' from the individual feature standard deviations.
31
+#' 
32
+#' @param dims vector of two integers containing the dimensions of the data matrix for the clustering
33
+#' @param NClust Number of cluster for running vsclust on (does no influence the calculation of `mm`)
34
+#' @param Sds individual standard deviations, set to 1 if not available
35
+#' @return list of `m`: individual fuzzifiers, `mm`: standard fuzzifier for fcm clustering when not using vsclust algorithm
36
+#' @examples
37
+#' # Generate some random data
38
+#' data <- matrix(rnorm(1:1000), nrow=100)
39
+#' # Estimate fuzzifiers
40
+#' fuzz_out <- determine_fuzz(dim(data), 1)
41
+#' # Run clustering
42
+#' clres <- vsclust_algorithm(data, centers=10, m=fuzz_out$mm)
43
+#' @export
44
+#' @references 
45
+#' Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
46
+#' 
47
+#' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
48
+#' 
49
+#' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
50
+determine_fuzz <- function(dims, NClust, Sds = 1) {
51
+  D<-dims[2]
52
+  d<-sqrt(D/2)
53
+  mm <- 1 + (1418/dims[1] + 22.05)* dims[2]^(-2) + (12.33/dims[1] + 0.243) * 
54
+    dims[2]^(-0.0406*log(dims[1])-0.1134)
55
+  
56
+  ### d_i and d_t
57
+  difunc <- function(c,D) { x <- 0:c; sum(choose(c,x)/(x*D+1)*(-1)^x) }
58
+  
59
+  di <- difunc(NClust,D)  /sqrt(pi) * gamma(D/2+1)^(1/D)
60
+  dt <- (NClust)^(-1/D)
61
+  p <- dnorm(di,0,Sds) * (1-dnorm(dt,0,Sds))^(NClust-1)
62
+  
63
+  m <- mm + p*mm*(D/3-1)
64
+  m[m==Inf]<-0
65
+  m[m==0]<-NA
66
+  m[is.na(m)]<-mm*10
67
+  
68
+  ## If m for highest Sd is mm then all = mm
69
+  if (m[which.max(Sds)]== mm) 
70
+    m[seq_len(length(m))] <- mm
71
+  
72
+  return(list (m=m, mm=mm))
73
+  
74
+}
75
+
76
+
77
+#' Determine optimal cluster number from validity index
78
+#' 
79
+#' Calculated the optimal number from expected behavior of the indices. This would be a large decay for
80
+#' the Minimum Centroid Distance and a minimum for the Xie Beni index
81
+#' 
82
+#' @param ClustInd Output from estimClustNum providing the calculated cluster validity indices
83
+#' @param index Either "MinCentroidDist" or "XieBeni"
84
+#' @param method Either "VSClust" or "FCM" for standard fuzzy c-means clustering
85
+#' @return optimal cluster number
86
+#' @examples
87
+#'   data("artificial_clusters")
88
+#'   dat <- averageCond(artificial_clusters, 5, 10)
89
+#'   dat <- scale(dat)
90
+#' dat <- cbind(dat, 1)
91
+#' ClustInd <- estimClustNum(dat, 10)
92
+#' optimalClustNum
93
+#' @export
94
+#' @references 
95
+#' Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
96
+#' 
97
+#' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
98
+#' 
99
+#' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
100
+optimalClustNum <- function(ClustInd, index="MinCentroidDist", method="VSClust") {
101
+  allowedInd <- c("XieBeni", "MinCentroidDist")
102
+  allowedMethod <- c("FCM", "VSClust")
103
+  if (!any(index == allowedInd)) {
104
+    stop(paste("index needs to be one of", paste(allowedInd, collapse=" ")))
105
+  }
106
+  if (!any(method == allowedMethod)) {
107
+    stop(paste("method needs to be one of", paste(allowedMethod, collapse = " ")))
108
+  }
109
+  
110
+  tClustInd <- ClustInd[, grep(index, colnames(ClustInd))]
111
+  tClustInd <- tClustInd[, grep(method, colnames(tClustInd))]
112
+  opt_val <- NULL
113
+  if (length(tClustInd) < 3) 
114
+    stop("Minimal length of ClustInd vector is 3")
115
+  if (index == "MinCentroidDist") {
116
+    opt_val <- which.max(tClustInd[seq_len(length(tClustInd)-1)]-tClustInd[2:length(tClustInd)])
117
+  } else if (index == "XieBeni") {
118
+    opt_val <- which.min(tClustInd[seq_len(length(tClustInd))])
119
+    
120
+  }
121
+  return(as.numeric(opt_val + 2))
122
+}
123
+
26 124
 
27 125
 #' Xie Beni Index of clustering object
28 126
 #' 
... ...
@@ -161,10 +259,13 @@ vsclust_algorithm <-
161 259
     
162 260
     u <- matrix(0.0,  nrow = xrows, ncol = ncenters)
163 261
     iter <- c(0L)
164
-    val <- vsclust:::c_plusplus_means(x, centers, weights, m, dist-1, iter.max, reltol, verbose, u , 1, iter, NA, rate.par)
262
+    val <- vsclust:::c_plusplus_means(x, centers, weights, m, dist-1, iter.max, 
263
+                                      reltol, verbose, u , 1, iter, NA, rate.par)
165 264
     # put modified values in retval
166
-    retval <- list(x=x, xrows = xrows, xcols = xcols, centers = centers,ncenters=ncenters, m = m, dist = dist -1,
167
-                   iter.max = iter.max, reltol = reltol, verbose = verbose, rate.par = rate.par, u = u, ermin = val, iter = iter)
265
+    retval <- list(x=x, xrows = xrows, xcols = xcols, centers = centers,
266
+                   ncenters=ncenters, m = m, dist = dist -1,
267
+                   iter.max = iter.max, reltol = reltol, verbose = verbose, 
268
+                   rate.par = rate.par, u = u, ermin = val, iter = iter)
168 269
     
169 270
     centers <- matrix(retval$centers, ncol = xcols,
170 271
                       dimnames = list(1 : ncenters,
... ...
@@ -231,7 +332,7 @@ print.fclust <-
231 332
 #' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
232 333
 #' 
233 334
 #' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
234
- 
335
+
235 336
 mfuzz.plot <- function (dat, cl, mfrow = c(1, 1), colo, min.mem = 0, time.labels, 
236 337
                         filename=NA,xlab="Time",ylab="Expression changes") 
237 338
 {
... ...
@@ -306,11 +407,11 @@ mfuzz.plot <- function (dat, cl, mfrow = c(1, 1), colo, min.mem = 0, time.labels
306 407
                      ylim = c(ymin, ymax), xlab = xlab, ylab = ylab, 
307 408
                      main = paste("Cluster", j), axes = FALSE)
308 409
         if (missing(time.labels)) {
309
-          axis(1, seq_len(dim(dat)[[2]]), c(seq_lendim(dat)[[2]]))
410
+          axis(1, seq_len(dim(dat)[[2]]), seq_len(dim(dat)[[2]]))
310 411
           axis(2)
311 412
         }
312 413
         else {
313
-          axis(1, se_len(dim(dat)[[2]]), time.labels)
414
+          axis(1, seq_len(dim(dat)[[2]]), time.labels)
314 415
           axis(2)
315 416
         }
316 417
       }
... ...
@@ -319,7 +420,7 @@ mfuzz.plot <- function (dat, cl, mfrow = c(1, 1), colo, min.mem = 0, time.labels
319 420
           tmpcol <- (tmpmem >= colorseq[jj] & tmpmem <= 
320 421
                        colorseq[jj + 1])
321 422
           
322
-          if (sum(tmpcol, na.rm=T) > 0) {
423
+          if (sum(tmpcol, na.rm=TRUE) > 0) {
323 424
             tmpind <- which(tmpcol)
324 425
             for (k in seq_len(length(tmpind))) {
325 426
               lines(tmp[tmpind[k], ], col = colo[jj])
... ...
@@ -332,16 +433,76 @@ mfuzz.plot <- function (dat, cl, mfrow = c(1, 1), colo, min.mem = 0, time.labels
332 433
   if (!is.na(filename))   dev.off()
333 434
 }
334 435
 
436
+#' Plotting results from estimating the cluster number
437
+#' 
438
+#' This function visualizes the output from estimClustNumber, and there particularly the
439
+#' two validity indices Minimum Centroid Distance and Xie Beni Index.
440
+#' 
441
+#' @param ClustInd Matrix with values from validity indices
442
+#' @return Multiple panels showing expression profiles of clustered features passing the min.mem threshold
443
+#' @examples 
444
+#' data("artificial_clusters")
445
+#' dat <- averageCond(artificial_clusters, 5, 10)
446
+#' dat <- scale(dat)
447
+#' dat <- cbind(dat, 1)
448
+#' ClustInd <- estimClustNum(dat, 10)
449
+#' estimClust.plot(ClustInd)
450
+
451
+#' @export
452
+#' @references 
453
+#' Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
454
+#' 
455
+#' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
456
+#' 
457
+#' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
458
+estimClust.plot <- function(ClustInd) {
459
+  par(mfrow=c(1,3))
460
+  maxClust <- nrow(ClustInd)+2
461
+  plot(3:maxClust,ClustInd[seq_len(nrow(ClustInd)),"MinCentroidDist_VSClust"],
462
+       col=2 , type="b", 
463
+       main="Min. centroid distance\n(Highest jump is best)",
464
+       xlab="Number of clusters", ylab="Index",
465
+       ylim=c(min(ClustInd[,grep("MinCentroidDist", 
466
+                                 colnames(ClustInd))],na.rm=TRUE),
467
+              max(ClustInd[,grep("MinCentroidDist", 
468
+                                 colnames(ClustInd))],na.rm=TRUE)))
469
+  lines(3:maxClust,ClustInd[seq_len(nrow(ClustInd)),"MinCentroidDist_FCM"],
470
+        col=3,type="b")
471
+  dmindist <- optimalClustNum(ClustInd) 
472
+  points(dmindist,ClustInd[dmindist-2,"MinCentroidDist_VSClust"],pch=15,col=1,cex=2)
473
+  legend("topright",legend = c("VSClust","Standard"), lty=c(1,1),col=2:3)
474
+  grid(NULL,NA,lwd=1,col=1)
475
+  plot(3:maxClust,ClustInd[seq_len(nrow(ClustInd)),"XieBeni_VSClust"], col=2, 
476
+       type="b", main="Xie-Beni index\n(Lowest is best)",
477
+       xlab="Number of clusters", ylab="Index",
478
+       ylim=c(min(ClustInd[,grep("XieBeni", colnames(ClustInd))],na.rm=TRUE),
479
+              max(ClustInd[,grep("XieBeni", colnames(ClustInd))],na.rm=TRUE)))
480
+  lines(3:maxClust,ClustInd[seq_len(nrow(ClustInd)),"XieBeni_FCM"],type="b",col=3)
481
+  dxiebeni <- optimalClustNum(ClustInd, index="XieBeni") 
482
+  points(dxiebeni,ClustInd[dxiebeni-2,"XieBeni_VSClust"],pch=15,col=1,cex=2)
483
+  legend("topright",legend = c("VSClust","Standard"), lty=c(1,1),col=2:3)
484
+  grid(NULL,NA,lwd=1,col=1)
485
+  plot(3:maxClust,ClustInd[seq_len(nrow(ClustInd)),"NumVSClust"], col=2, type="b", 
486
+       main="Total number of assigned features",
487
+       xlab="Number of clusters", ylab="Assigned features",
488
+       ylim=c(min(ClustInd[,grep("Num", colnames(ClustInd))],na.rm=TRUE),
489
+              max(ClustInd[,grep("Num", colnames(ClustInd))],na.rm=TRUE)))
490
+       lines(3:maxClust,ClustInd[seq_len(nrow(ClustInd)),"NumFCM"],type="b",col=3)
491
+       legend("topright",legend = c("VSClust","Standard"), lty=c(1,1),col=2:3)
492
+       # finally plot
493
+       p <- recordPlot()
494
+}
335 495
 
336 496
 #' arrange cluster member numbers from largest to smallest
337 497
 #' @param Bestcl fclust object
338 498
 #' @param NClust Number of clusters
339 499
 #' @importFrom matrixStats rowMaxs
340 500
 SwitchOrder <- function(Bestcl,NClust) {
341
-  switching <- as.numeric(names(sort(table(Bestcl$cluster[rowMaxs(Bestcl$membership)>0.5]),decreasing=T)))
501
+  switching <- as.numeric(names(sort(table(Bestcl$cluster[rowMaxs(Bestcl$membership)>0.5]),
502
+                                     decreasing=TRUE)))
342 503
   if (length(switching)<NClust) 
343 504
     switching <- c(switching,which(!((seq_len(NClust)) %in% switching)))
344
-  switching2 <- seq_lenNClust
505
+  switching2 <- seq_len(NClust)
345 506
   names(switching2) <- switching
346 507
   tBest <- Bestcl
347 508
   tBest$centers <- Bestcl$centers[switching,]
... ...
@@ -354,7 +515,7 @@ SwitchOrder <- function(Bestcl,NClust) {
354 515
   tBest
355 516
 }
356 517
 
357
-#' Function to run clustering
518
+#' Function to run clustering with automatic fuzzifier settings (might become obsolete)
358 519
 #' 
359 520
 #' Run original fuzzy c-means and vsclust for a number of clusters and the given data set including data pre-processing and
360 521
 #' automatic setting of the data-dependent parameters like the lower limit of the fuzzifier.
... ...
@@ -387,44 +548,28 @@ SwitchOrder <- function(Bestcl,NClust) {
387 548
 #' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
388 549
 #' 
389 550
 #' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
390
-ClustComp <- function(dat,NSs=10,NClust=NClust,Sds=Sds, cl=cl) {
391
-  D<-ncol(dat)
392
-  d<-sqrt(D/2)
393
-  dims<-dim(dat)
394
-  mm <- 1 + (1418/dims[1] + 22.05)* dims[2]^(-2) + (12.33/dims[1] + 0.243)*dims[2]^(-0.0406*log(dims[1])-0.1134)
395
-  
396
-  ### d_i and d_t
397
-  difunc <- function(c,D) { x <- 0:c; sum(choose(c,x)/(x*D+1)*(-1)^x) }
398
-  
399
-  di <- difunc(NClust,D)  /sqrt(pi) * gamma(D/2+1)^(1/D)
400
-  dt <- (NClust)^(-1/D)
401
-  
402
-  p <- dnorm(di,0,Sds) * (1-dnorm(dt,0,Sds))^(NClust-1)
403
-  
404
-  m <- mm + p*mm*(D/3-1)
405
-  m[m==Inf]<-0
406
-  m[m==0]<-NA
407
-  m[is.na(m)]<-mm*10
551
+ClustComp <- function(dat,NSs=10,NClust=NClust,Sds=Sds, cl=parallel::makePSOCKcluster(1)) {
552
+  fuzz_out <- determine_fuzz(dim(dat), NClust, Sds)
553
+  m <- fuzz_out$m
554
+  mm <- fuzz_out$mm
408 555
   
409
-  ## If m for highest Sd is mm then all = mm
410
-  if (m[which.max(Sds)]== mm) 
411
-    m[seq_len(length(m))] <- mm
412
-  
413
-  # Moved the parallelization out as way too slow 
414
-  #  cl <- makeCluster(cores)
415
-  #  clusterExport(cl=cl,varlist=c("tData","NClust","m","vsclust_algorithm"),envir=environment())
416
-  clusterExport(cl=cl,varlist=c("dat","NClust","m"),envir=environment())
417
-  cls <- parLapply(cl,seq_len(NSs), function(x) vsclust_algorithm(dat,NClust,m=m,verbose=F,iter.max=1000))
556
+  clusterExport(cl=cl,varlist=c("dat","NClust","m","mm"),envir=environment())
557
+  cls <- parLapply(cl,seq_len(NSs), function(x) vsclust_algorithm(dat,NClust,
558
+                                                                  m=m,verbose=F,
559
+                                                                  iter.max=1000))
418 560
   # cls <- lapply(1:NSs, function(x) vsclust_algorithm(tData,NClust,m=m,verbose=F,iter.max=1000))  #print(cls[[1]])
419 561
   Bestcl <- cls[[which.min(lapply(cls,function(x) x$withinerror))]]
420
-  cls <- parLapply(cl,seq_len(NSs), function(x) vsclust_algorithm(dat,NClust,m=mm,verbose=F,iter.max=1000))
562
+  cls <- parLapply(cl,seq_len(NSs), function(x) vsclust_algorithm(dat,NClust,
563
+                                                                  m=mm,verbose=F,
564
+                                                                  iter.max=1000))
421 565
   Bestcl2 <- cls[[which.min(lapply(cls,function(x) x$withinerror))]]
422 566
   # stopCluster(cl)
423 567
   
424 568
   # return validation indices
425 569
   list(indices=c(min(dist(Bestcl$centers)),cvalidate.xiebeni(Bestcl,mm),
426 570
                  min(dist(Bestcl2$centers)),cvalidate.xiebeni(Bestcl2,mm)),
427
-       Bestcl=Bestcl,Bestcl2=Bestcl2,m=m,withinerror=Bestcl$withinerror,withinerror2=Bestcl2$withinerror) 
571
+       Bestcl=Bestcl,Bestcl2=Bestcl2,m=m,withinerror=Bestcl$withinerror,
572
+       withinerror2=Bestcl2$withinerror) 
428 573
 }
429 574
 
430 575
 #' Paired statistical testing
... ...
@@ -522,12 +667,13 @@ SignAnalysis <- function(Data,NumCond,NumReps) {
522 667
   ##########################################################
523 668
   if (is.null(rownames(Data))) rownames(Data) <- paste0("feature",seq_len(nrow(Data)))
524 669
   # significance analysis
525
-  Reps <- rep(seq_len(NumCond,NumReps))
670
+  Reps <- rep(seq_len(NumCond),NumReps)
526 671
   design <- model.matrix(~0+factor(Reps-1))
527 672
   colnames(design)<-paste("i",c(seq_len(NumCond)),sep="")
528 673
   contrasts<-NULL
529 674
   First <- 1
530
-  for (i in (seq_len(NumCond))[-First]) contrasts<-append(contrasts,paste(colnames(design)[i],"-",colnames(design)[First],sep=""))
675
+  for (i in (seq_len(NumCond))[-First]) contrasts<-append(contrasts,
676
+                                                          paste(colnames(design)[i],"-",colnames(design)[First],sep=""))
531 677
   contrast.matrix<-makeContrasts(contrasts=contrasts,levels=design)
532 678
   lm.fitted <- lmFit(Data,design)
533 679
   
... ...
@@ -535,7 +681,8 @@ SignAnalysis <- function(Data,NumCond,NumReps) {
535 681
   lm.bayes<-eBayes(lm.contr)
536 682
   #topTable(lm.bayes)
537 683
   plvalues <- lm.bayes$p.value
538
-  qvalues <- matrix(NA,nrow=nrow(plvalues),ncol=ncol(plvalues),dimnames=dimnames(plvalues))
684
+  qvalues <- matrix(NA,nrow=nrow(plvalues),ncol=ncol(plvalues),
685
+                    dimnames=dimnames(plvalues))
539 686
   # qvalue correction
540 687
   for (i in seq_len(ncol(plvalues))) {
541 688
     tqs <- tryCatch(qvalue(na.omit(plvalues[,i]))$qvalues, 
... ...
@@ -633,9 +780,9 @@ calcBHI <- function(Accs,gos) {
633 780
 #' @export
634 781
 averageCond <- function(data, NumReps, NumCond) {
635 782
   # Calculates means over replicates
636
-  tdat<-rowMeans(data[,seq(1,NumReps*NumCond,NumCond)],na.rm=T)
783
+  tdat<-rowMeans(data[,seq(1,NumReps*NumCond,NumCond)],na.rm=TRUE)
637 784
   for (i in 2:NumCond) {
638
-    tdat<-cbind(tdat,rowMeans(data[,seq(i,NumReps*NumCond,NumCond)],na.rm=T))
785
+    tdat<-cbind(tdat,rowMeans(data[,seq(i,NumReps*NumCond,NumCond)],na.rm=TRUE))
639 786
   }
640 787
   colnames(tdat)<-paste("Mean of log ",LETTERS702[seq_len(NumCond)],sep="")
641 788
   tdat  
... ...
@@ -676,7 +823,7 @@ pcaWithVar <- function(data, NumReps, NumCond, Sds=1) {
676 823
   pcaDat <- (pcaDat[complete.cases(pcaDat),])
677 824
   validate(need(length(pcaDat)> 0, "Principal component analysis not shown as too many missing values"))      
678 825
   validate(need(nrow(pcaDat)> 10, "Principal component analysis not shown as too many missing values"))      
679
-  pca<-prcomp(pcaDat,scale=T,retx=TRUE)
826
+  pca<-prcomp(pcaDat,scale=TRUE,retx=TRUE)
680 827
   # scores <- pca$x
681 828
   # loadings <- pca$rotation
682 829
   scores <- pca$rotation
... ...
@@ -686,11 +833,13 @@ pcaWithVar <- function(data, NumReps, NumCond, Sds=1) {
686 833
   Sds[is.na(Sds)] <- max(Sds, na.rm=TRUE)
687 834
   # Scaling suitable for visualization
688 835
   Sds <- sqrt(Sds)
689
-  plot(loadings,cex=Sds,pch=16,col=paste("#000000",sprintf("%02X",as.integer(255/max(1/Sds)/Sds)),sep=""))
836
+  plot(loadings,cex=Sds,pch=16,
837
+       col=paste("#000000",sprintf("%02X",as.integer(255/max(1/Sds)/Sds)),sep=""))
690 838
   title(main="Principal component analysis of data set (loadings)",sub="The point size corresponds to the estimated standard deviation")
691 839
   plot(scores,pch=19,col=rainbow(NumCond)[plab])
692 840
   title(main="Principal component analysis of data set (scores)",sub="Colors denote different conditions")
693
-  legend("topright",paste("Condition",seq_len(NumCond)),pch=rep(19,NumCond),col=rainbow(NumCond)[seq_len(NumCond)])
841
+  legend("topright",paste("Condition",seq_len(NumCond)),pch=rep(19,NumCond),
842
+         col=rainbow(NumCond)[seq_len(NumCond)])
694 843
 }
695 844
 
696 845
 ### Wrapper functions
... ...
@@ -708,7 +857,7 @@ pcaWithVar <- function(data, NumReps, NumCond, Sds=1) {
708 857
 #' @return list with the items `dat` (data matrix of features averaged over replicates and last column with their standard deviations), `qvals` FDRs from the statistical tests (each conditions versus the first), `StatFileOut` all of before for saving in file
709 858
 #' @examples
710 859
 #' data <- matrix(rnorm(2000), nrow=200)
711
-#' stats <- statWrapper(data, 5, 2, isStat=TRUE)
860
+#' stats <- PrepareForVSClust(data, 5, 2, isStat=TRUE)
712 861
 #' 
713 862
 #' @import stats
714 863
 #' @importFrom matrixStats rowSds
... ...
@@ -720,7 +869,7 @@ pcaWithVar <- function(data, NumReps, NumCond, Sds=1) {
720 869
 #' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
721 870
 #' 
722 871
 #' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
723
-statWrapper <- function(dat, NumReps, NumCond, isPaired=F, isStat) {
872
+PrepareForVSClust <- function(dat, NumReps, NumCond, isPaired=F, isStat) {
724 873
   qvals <- statFileOut <- Sds <- NULL
725 874
   tdat <- NULL
726 875
   
... ...
@@ -739,6 +888,7 @@ statWrapper <- function(dat, NumReps, NumCond, isPaired=F, isStat) {
739 888
     colnames(qvals) <- paste("qvalue ",LETTERS702[2:(NumCond)],"vsA",sep="")
740 889
     
741 890
     tdat <- averageCond(dat, NumReps, NumCond)
891
+    
742 892
   } else {
743 893
     Sds <- dat[,ncol(dat)]
744 894
     tdat <- dat[,seq_len(ncol(dat)-1)]
... ...
@@ -753,7 +903,7 @@ statWrapper <- function(dat, NumReps, NumCond, isPaired=F, isStat) {
753 903
     statFileOut <- cbind(tdat,Sds)
754 904
   }
755 905
   
756
-  pcaWithVar(dat, NumReps, NumCond, Sds)
906
+  pcaWithVar(dat, NumReps, NumCond, Sds / rowSds(tdat, na.rm=TRUE))
757 907
   
758 908
   ## Preparing output
759 909
   Out <- list(dat=cbind(tdat,Sds), qvals=qvals, statFileOut=statFileOut)
... ...
@@ -776,7 +926,7 @@ statWrapper <- function(dat, NumReps, NumCond, isPaired=F, isStat) {
776 926
 #' @examples
777 927
 #' data <- matrix(rnorm(1000), nrow=100)
778 928
 #' estim_out <- estimClustNum(data, maxClust=10)
779
-#' estim_out$p
929
+#' best_number <- max(estim_out[1])
780 930
 #' @import limma
781 931
 #' @import parallel
782 932
 #' @import stats
... ...
@@ -786,15 +936,10 @@ statWrapper <- function(dat, NumReps, NumCond, isPaired=F, isStat) {
786 936
 #' @importFrom matrixStats rowMaxs 
787 937
 #' @export
788 938
 estimClustNum<- function(dat, maxClust=25, cores=1) {
789
-  ClustInd<-matrix(NA,nrow=maxClust,ncol=6)
939
+  ClustInd<-matrix(NA,nrow=maxClust-2,ncol=6)
790 940
   if (is.null(rownames(dat))) rownames(dat) <- seq_len(nrow(dat))
791 941
   tData <- dat[,seq_len(ncol(dat)-1)]
792 942
   colnames(tData)<-NULL
793
-  # We do not filter anymore for NAs, and we do not impute
794
-  # PExpr <- new("ExpressionSet",expr=as.matrix(tData))
795
-  # PExpr.r <- filter.NA(PExpr, thres = 0.25)
796
-  # PExpr <- fill.NA(PExpr.r,mode = "mean")
797
-  # tmp <- filter.std(PExpr,min.std=0,visu=FALSE)
798 943
   
799 944
   # define parallelization
800 945
   cl <- makeCluster(cores)
... ...
@@ -804,7 +949,7 @@ estimClustNum<- function(dat, maxClust=25, cores=1) {
804 949
   # Standardise
805 950
   sds <- dat[rownames(tData), ncol(dat)]
806 951
   # scale standard deviations by the ones in the actual data to cope for the following standardization 
807
-  sds <- sds / rowSds(as.matrix(tData),na.rm=T)
952
+  sds <- sds / (rowSds(as.matrix(tData),na.rm=TRUE))
808 953
   tData <- t(scale(t(tData)))
809 954
   
810 955
   multiOut <- lapply(3:maxClust,function(x) {    
... ...
@@ -821,36 +966,12 @@ estimClustNum<- function(dat, maxClust=25, cores=1) {
821 966
   stopCluster(cl)
822 967
   
823 968
   for (NClust in 3:maxClust) 
824
-    ClustInd[NClust,] <- multiOut[[NClust-2]]
825
-  
826
-  dmindist <- c(which.max(ClustInd[3:(maxClust-2),1]-ClustInd[4:(maxClust-1),1])+2,
827
-                which.max(ClustInd[3:(maxClust-2),3]-ClustInd[4:(maxClust-1),3])+2)
828
-  dxiebeni <- c(which.min(ClustInd[3:(maxClust-1),2])+2,
829
-                which.min(ClustInd[3:(maxClust-1),4])+2)  
830
-  par(mfrow=c(1,3))
831
-  plot(3:maxClust,ClustInd[3:(maxClust),1],col=2 , type="b", 
832
-       main="Min. centroid distance\n(Highest jump is best)",
833
-       xlab="Number of clusters", ylab="Index",ylim=c(min(ClustInd[,c(1,3)],na.rm=T),max(ClustInd[,c(1,3)],na.rm=T)))
834
-  lines(3:maxClust,ClustInd[3:(maxClust),3],col=3,type="b")
835
-  points(dmindist[1],ClustInd[dmindist[1],1],pch=15,col=1,cex=2)
836
-  legend("topright",legend = c("VSClust","Standard"), lty=c(1,1),col=2:3)
837
-  grid(NULL,NA,lwd=1,col=1)
838
-  plot(3:maxClust,ClustInd[3:(maxClust),2], col=2, type="b", main="Xie-Beni index\n(Lowest is best)",
839
-       xlab="Number of clusters", ylab="Index",ylim=c(min(ClustInd[,c(2,4)],na.rm=T),max(ClustInd[,c(2,4)],na.rm=T)))
840
-  lines(3:maxClust,ClustInd[3:(maxClust),4],type="b",col=3)
841
-  points(dxiebeni[1],ClustInd[dxiebeni[1],2],pch=15,col=1,cex=2)
842
-  legend("topright",legend = c("VSClust","Standard"), lty=c(1,1),col=2:3)
843
-  grid(NULL,NA,lwd=1,col=1)
844
-  plot(3:maxClust,ClustInd[3:(maxClust),5], col=2, type="b", main="Total number of assigned features",
845
-       xlab="Number of clusters", ylab="Assigned features",ylim=c(min(ClustInd[,5:6],na.rm=T),max(ClustInd[,5:6],na.rm=T)))
846
-  lines(3:maxClust,ClustInd[3:(maxClust),6],type="b",col=3)
847
-  legend("topright",legend = c("VSClust","Standard"), lty=c(1,1),col=2:3)
848
-  # finally plot
849
-  p <- recordPlot()
969
+    ClustInd[NClust-2,] <- multiOut[[NClust-2]]
970
+  rownames(ClustInd) <- paste0("num_clust_",3:maxClust)
971
+  colnames(ClustInd) <- c("MinCentroidDist_VSClust", "XieBeni_VSClust", "MinCentroidDist_FCM", "XieBeni_FCM", "NumVSClust", "NumFCM")
850 972
   
851 973
   # Output
852
-  Out <- list(ClustdInd=ClustInd, p=p, numclust=dmindist[1])
853
-  Out
974
+  ClustInd
854 975
 }
855 976
 
856 977
 #' Wrapper for running cluster analysis
... ...
@@ -914,7 +1035,8 @@ runClustWrapper <- function(dat, NClust, proteins=NULL, VSClust=TRUE, cores) {
914 1035
   par(mar=c(2,2,3,3),mgp=c(2,1,0))
915 1036
   par(mar=par("mar")/max(1,NClust/20))
916 1037
   
917
-  mfuzz.plot(tData,cl=Bestcl,mfrow=c(round(sqrt(NClust)),ceiling(sqrt(NClust))),min.mem=0.5,colo="fancy")
1038
+  mfuzz.plot(tData,cl=Bestcl,mfrow=c(round(sqrt(NClust)),ceiling(sqrt(NClust))),
1039
+             min.mem=0.5,colo="fancy")
918 1040
   p <- recordPlot()
919 1041
   # par(lwd=1,mar=oldmar)
920 1042
   
... ...
@@ -963,7 +1085,7 @@ runClustWrapper <- function(dat, NClust, proteins=NULL, VSClust=TRUE, cores) {
963 1085
 #' @param protnames vector providing the corresponding gene/protein names of the features (set to NULL for directly using the feature names (default))
964 1086
 #' @param idtypes type of IDs for features given by genes/proteins (generic gene names are not working)
965 1087
 #' @param infosource Type of gene annotation (e.g. KEGG_PATHWAY)
966
-#' @return list with the items `fullFuncs` clusterProfiler object with all results, `redFuncs` clusterProfiler object with reduce (top 20) results, `BHI` Biological Homogeneity Index
1088
+#' @return plot object to be able to pass the figures to e.g. shiny
967 1089
 #' @examples
968 1090
 #'  library(clusterProfiler)
969 1091
 #'  data(gcSample)
... ...
@@ -987,7 +1109,7 @@ runFuncEnrich <- function(cl, protnames=NULL, idtypes, infosource) {
987 1109
   for (c in seq_len(max(cl$cluster))) {
988 1110
     cname <- paste("Cluster",c, sep="_")
989 1111
     Accs[[cname]] <- names(which(cl$cluster==c & rowMaxs(cl$membership)>0.5))
990
-
1112
+    
991 1113
     Accs[[cname]] <- Accs[[cname]][Accs[[cname]]!=""]
992 1114
     if (length(Accs[[cname]])>0) {
993 1115
       if (!is.null(protnames)) {
... ...
@@ -1008,7 +1130,8 @@ runFuncEnrich <- function(cl, protnames=NULL, idtypes, infosource) {
1008 1130
   if (!is.null(getDefaultReactiveDomain()))
1009 1131
     incProgress(0.7, detail = "received")
1010 1132
   message("got data from DAVID\n")
1011
-  x@compareClusterResult <- cbind(x@compareClusterResult,log10padval=log10(x@compareClusterResult$p.adjust))
1133
+  x@compareClusterResult <- cbind(x@compareClusterResult,
1134
+                                  log10padval=log10(x@compareClusterResult$p.adjust))
1012 1135
   y <- new("compareClusterResult",compareClusterResult=x@compareClusterResult)
1013 1136
   if (length(unique(y@compareClusterResult$ID)) > 20) {
1014 1137
     message("Reducing number of DAVID results\n")
... ...
@@ -1023,3 +1146,20 @@ runFuncEnrich <- function(cl, protnames=NULL, idtypes, infosource) {
1023 1146
   
1024 1147
 }
1025 1148
 
1149
+#' Run VSClust as Shiny app
1150
+#' 
1151
+#' You will get the full functionality of the VSClust workflow with multiple visualizations and downloads
1152
+#' 
1153
+#' @return The shiny app should open in a browser or in RStudio.
1154
+#' @examples
1155
+#' runVSClustApp()
1156
+#' @export
1157
+#' @references 
1158
+#' Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
1159
+#' 
1160
+#' Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
1161
+#' 
1162
+#' Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
1163
+runVSClustApp <- function() {
1164
+  shiny::runApp(system.file("shiny/", package="vsclust"))
1165
+}
1026 1166
\ No newline at end of file
... ...
@@ -1,10 +1,6 @@
1 1
 # Generated by using Rcpp::compileAttributes() -> do not edit by hand
2 2
 # Generator token: 10BE3573-1514-4C36-9D1C-5A225CD40393
3 3
 
4
-rcpp_hello_world <- function() {
5
-    .Call('_vsclust_rcpp_hello_world', PACKAGE = 'vsclust')
6
-}
7
-
8 4
 fill_missing_vals_and_ratio <- function(feature_mat, missing_vals, ratio_missing_vals, missing_value = NA_real_) {
9 5
     invisible(.Call('_vsclust_fill_missing_vals_and_ratio', PACKAGE = 'vsclust', feature_mat, missing_vals, ratio_missing_vals, missing_value))
10 6
 }
... ...
@@ -1,5 +1,5 @@
1 1
 ## code to prepare `DATASET` dataset goes here
2
-artificial_clusters <- read.csv("data-raw/ArtData.csv")
2
+artificial_clusters <- read.csv("data-raw/ArtData.csv", row.names=1)
3 3
 protein_expressions <- read.csv("data-raw/ProtExample.csv",row.names=1)
4 4
 protein_expressions <- protein_expressions[2:nrow(protein_expressions),]
5 5
 usethis::use_data(protein_expressions, overwrite = TRUE)
6 6
Binary files a/data/artificial_clusters.rda and b/data/artificial_clusters.rda differ
... ...
@@ -116,7 +116,7 @@ if(protnames) {
116 116
 
117 117
 
118 118
 #### running statistical analysis and estimation of individual variances
119
-statOut <- statWrapper(dat, NumReps, NumCond, isPaired, isStat)
119
+statOut <- PrepareForVSClust(dat, NumReps, NumCond, isPaired, isStat)
120 120
 
121 121
 dat <- statOut$dat
122 122
 Sds <- dat[,ncol(dat)]
... ...
@@ -130,14 +130,15 @@ write.csv(statOut$statFileOut,paste("",Experiment,"statFileOut.csv",sep=""))
130 130
 #### Estimate number of clusters with maxClust as maximum number clusters to test for
131 131
 ## Write output into file 
132 132
 pdf(paste(Experiment,"EstimatedClustNumber.pdf", sep=""),height=6,width=15)
133
-clustNumOut <- estimClustNum(dat, maxClust, cores)
133
+ClustInd <- estimClustNum(dat, maxClust, cores)
134
+estimClust.plot(ClustInd)
134 135
 dev.off()
135 136
 
136 137
 #### Use estimate cluster number or use own
137 138
 if (PreSetNumClustVSClust == 0)
138
-  PreSetNumClustVSClust <- clustNumOut$numclust
139
+  PreSetNumClustVSClust <- optimalClustNum(ClustInd)
139 140
 if (PreSetNumClustStand == 0)
140
-  PreSetNumClustStand <- clustNumOut$numclust
141
+  PreSetNumClustStand <- optimalClustNum(ClustInd, method="FCM")
141 142
 
142 143
 
143 144
 
... ...
@@ -187,17 +187,17 @@ shinyServer(function(input, output,clientData,session) {
187 187
         NumCond <- input$NumCond
188 188
         print(NumReps)
189 189
         print(NumCond)
190
-        if(!input$qcol_order) {
191
-          dat <- dat[,rep(0:(NumCond-1),NumReps)*NumReps+rep(1:(NumReps), each=NumCond)]
192
-        }
193 190
         
194 191
         dat[!is.finite(as.matrix(dat))] <- NA
195 192
         num_miss <- sum(is.na(dat))
196 193
         if (input$isStat) {
197 194
           validate(need(ncol(dat)==NumReps*NumCond, "Number of data columns must correspond to product of conditions and replicates!"))
195
+          if(!input$qcol_order) {
196
+            dat <- dat[,rep(0:(NumCond-1),NumReps)*NumReps+rep(1:(NumReps), each=NumCond)]
197
+          }
198 198
         }
199 199
         fulldat <- dat
200
-        validate(need(try(statOut <- statWrapper(dat, NumReps, NumCond, input$isPaired, input$isStat)), 
200
+        validate(need(try(statOut <- PrepareForVSClust(dat, NumReps, NumCond, input$isPaired, input$isStat)), 
201 201
                       "Please remove the following items from your input file:\na) empty columns or rows\nb) non-numerical or infinite values\nc) commenting characters (e.g. #)"))
202 202
         
203 203
         dat <- statOut$dat
... ...
@@ -235,11 +235,12 @@ shinyServer(function(input, output,clientData,session) {
235 235
     isolate({
236 236
       if((input$clButton1)) {
237 237
         dat <- pars$dat
238
-        clustNumOut <- NULL
238
+        clustInd <- NULL
239 239
         withProgress(message="Calculating ...", min=3,max=maxClust, value=2,  {
240
-          clustNumOut <- estimClustNum(dat, input$maxclust, cores)
241
-          updateSliderInput(session,"nclust1",value=clustNumOut$numclust)
242
-          updateSliderInput(session,"nclust2",value=clustNumOut$numclust)
240
+          clustInd <- estimClustNum(dat, input$maxclust, cores)
241
+          estimClust.plot(clustInd)
242
+          updateSliderInput(session,"nclust1",value=optimalClustNum(clustInd))
243
+          updateSliderInput(session,"nclust2",value=optimalClustNum(clustInd, method="FCM"))
243 244
         })
244 245
         
245 246
         output$downloadParamEst <- downloadHandler(
... ...
@@ -248,7 +249,7 @@ shinyServer(function(input, output,clientData,session) {
248 249
           },
249 250
           content = function(file) {
250 251
             pdf(file,height=6,width=15)
251
-            print(clustNumOut$p)
252
+            estimClust.plot(clustInd)
252 253
             dev.off()  
253 254
           })
254 255
       }
... ...
@@ -286,7 +287,7 @@ shinyServer(function(input, output,clientData,session) {
286 287
               content = function(file) {
287 288
                 if (input$clustvar_tsv) {
288 289
                   write.table(data.frame(cluster=Bestcl$cluster,ClustOut$outFileClust,isClusterMember=rowMaxs(Bestcl$membership)>0.5,maxMembership=rowMaxs(Bestcl$membership),
289
-                                     Bestcl$membership), file, quote=F, sep="\t")
290
+                                         Bestcl$membership), file, quote=F, sep="\t")
290 291
                 } else {
291 292
                   write.csv(data.frame(cluster=Bestcl$cluster,ClustOut$outFileClust,isClusterMember=rowMaxs(Bestcl$membership)>0.5,maxMembership=rowMaxs(Bestcl$membership),
292 293
                                        Bestcl$membership), file)
... ...
@@ -341,7 +342,7 @@ shinyServer(function(input, output,clientData,session) {
341 342
               content = function(file) {
342 343
                 if (input$cluststd_tsv) {
343 344
                   write.table(data.frame(cluster=Bestcl$cluster,ClustOut$outFileClust,isClusterMember=rowMaxs(Bestcl$membership)>0.5,maxMembership=rowMaxs(Bestcl$membership),
344
-                                     Bestcl$membership), file, quote=F, sep="\t")
345
+                                         Bestcl$membership), file, quote=F, sep="\t")
345 346
                 } else {
346 347
                   write.csv(data.frame(cluster=Bestcl$cluster,ClustOut$outFileClust,isClusterMember=rowMaxs(Bestcl$membership)>0.5,maxMembership=rowMaxs(Bestcl$membership),
347 348
                                        Bestcl$membership), file)
... ...
@@ -2,9 +2,15 @@
2 2
 % Please edit documentation in R/HelperFuncs.R
3 3
 \name{ClustComp}
4 4
 \alias{ClustComp}
5
-\title{Function to run clustering}
5
+\title{Function to run clustering with automatic fuzzifier settings (might become obsolete)}
6 6
 \usage{
7
-ClustComp(dat, NSs = 10, NClust = NClust, Sds = Sds, cl = cl)
7
+ClustComp(
8
+  dat,
9
+  NSs = 10,
10
+  NClust = NClust,
11
+  Sds = Sds,
12
+  cl = parallel::makePSOCKcluster(1)
13
+)
8 14
 }
9 15
 \arguments{
10 16
 \item{dat}{a numeric data matrix}
11 17
similarity index 92%
12 18
rename from man/statWrapper.Rd
13 19
rename to man/PrepareForVSClust.Rd
... ...
@@ -1,10 +1,10 @@
1 1
 % Generated by roxygen2: do not edit by hand
2 2
 % Please edit documentation in R/HelperFuncs.R
3
-\name{statWrapper}
4
-\alias{statWrapper}
3
+\name{PrepareForVSClust}
4
+\alias{PrepareForVSClust}
5 5
 \title{Wrapper for statistical analysis}
6 6
 \usage{
7
-statWrapper(dat, NumReps, NumCond, isPaired = F, isStat)
7
+PrepareForVSClust(dat, NumReps, NumCond, isPaired = F, isStat)
8 8
 }
9 9
 \arguments{
10 10
 \item{dat}{matrix or data frame of numerical data. Columns are samples. Replicates are grouped (i.e. A1, B1, C1, A2, B2, C2) when letters denote conditions and numbers the replicates. In case of `isStat=F`, you need a last column for the standard deviations}
... ...
@@ -27,7 +27,7 @@ statistical testing with LIMMA, as well as scaling and filtering of missing valu
27 27
 }
28 28
 \examples{
29 29
 data <- matrix(rnorm(2000), nrow=200)
30
-stats <- statWrapper(data, 5, 2, isStat=TRUE)
30
+stats <- PrepareForVSClust(data, 5, 2, isStat=TRUE)
31 31
 
32 32
 }
33 33
 \references{
34 34
new file mode 100644
... ...
@@ -0,0 +1,37 @@
1
+% Generated by roxygen2: do not edit by hand
2
+% Please edit documentation in R/HelperFuncs.R
3
+\name{determine_fuzz}
4
+\alias{determine_fuzz}
5
+\title{Determine individual fuzzifier values}
6
+\usage{
7
+determine_fuzz(dims, NClust, Sds = 1)
8
+}
9
+\arguments{
10
+\item{dims}{vector of two integers containing the dimensions of the data matrix for the clustering}
11
+
12
+\item{NClust}{Number of cluster for running vsclust on (does no influence the calculation of `mm`)}
13
+
14
+\item{Sds}{individual standard deviations, set to 1 if not available}
15
+}
16
+\value{
17
+list of `m`: individual fuzzifiers, `mm`: standard fuzzifier for fcm clustering when not using vsclust algorithm
18
+}
19
+\description{
20
+This function calculated the values of the fuzzifier from a) the dimensions of the considered data set and b) 
21
+from the individual feature standard deviations.
22
+}
23
+\examples{
24
+# Generate some random data
25
+data <- matrix(rnorm(1:1000), nrow=100)
26
+# Estimate fuzzifiers
27
+fuzz_out <- determine_fuzz(dim(data), 1)
28
+# Run clustering
29
+clres <- vsclust_algorithm(data, centers=10, m=fuzz_out$mm)
30
+}
31
+\references{
32
+Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
33
+
34
+Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
35
+
36
+Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
37
+}
0 38
new file mode 100644
... ...
@@ -0,0 +1,33 @@
1
+% Generated by roxygen2: do not edit by hand
2
+% Please edit documentation in R/HelperFuncs.R
3
+\name{estimClust.plot}
4
+\alias{estimClust.plot}
5
+\title{Plotting results from estimating the cluster number}
6
+\usage{
7
+estimClust.plot(ClustInd)
8
+}
9
+\arguments{
10
+\item{ClustInd}{Matrix with values from validity indices}
11
+}
12
+\value{
13
+Multiple panels showing expression profiles of clustered features passing the min.mem threshold
14
+}
15
+\description{
16
+This function visualizes the output from estimClustNumber, and there particularly the
17
+two validity indices Minimum Centroid Distance and Xie Beni Index.
18
+}
19
+\examples{
20
+data("artificial_clusters")
21
+dat <- averageCond(artificial_clusters, 5, 10)
22
+dat <- scale(dat)
23
+dat <- cbind(dat, 1)
24
+ClustInd <- estimClustNum(dat, 10)
25
+estimClust.plot(ClustInd)
26
+}
27
+\references{
28
+Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
29
+
30
+Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
31
+
32
+Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
33
+}
... ...
@@ -26,5 +26,5 @@ given by a strong decay of the minimum centroid distance and/or a low value of t
26 26
 \examples{
27 27
 data <- matrix(rnorm(1000), nrow=100)
28 28
 estim_out <- estimClustNum(data, maxClust=10)
29
-estim_out$p
29
+best_number <- max(estim_out[1])
30 30
 }
... ...
@@ -35,6 +35,9 @@ mfuzz.plot(
35 35
 
36 36
 \item{ylab}{Label of y-axis}
37 37
 }
38
+\value{
39
+Multiple panels showing expression profiles of clustered features passing the min.mem threshold
40
+}
38 41
 \description{
39 42
 This function visualizes the clustered quantitative profiles in multiple figure panels. The parameters allow specifying the main 
40 43
 items like axes labels and color maps. The code is adopted from the MFuzz package.
41 44
new file mode 100644
... ...
@@ -0,0 +1,37 @@
1
+% Generated by roxygen2: do not edit by hand
2
+% Please edit documentation in R/HelperFuncs.R
3
+\name{optimalClustNum}
4
+\alias{optimalClustNum}
5
+\title{Determine optimal cluster number from validity index}
6
+\usage{
7
+optimalClustNum(ClustInd, index = "MinCentroidDist", method = "VSClust")
8
+}
9
+\arguments{
10
+\item{ClustInd}{Output from estimClustNum providing the calculated cluster validity indices}
11
+
12
+\item{index}{Either "MinCentroidDist" or "XieBeni"}
13
+
14
+\item{method}{Either "VSClust" or "FCM" for standard fuzzy c-means clustering}
15
+}
16
+\value{
17
+optimal cluster number
18
+}
19
+\description{
20
+Calculated the optimal number from expected behavior of the indices. This would be a large decay for
21
+the Minimum Centroid Distance and a minimum for the Xie Beni index
22
+}
23
+\examples{
24
+  data("artificial_clusters")
25
+  dat <- averageCond(artificial_clusters, 5, 10)
26
+  dat <- scale(dat)
27
+dat <- cbind(dat, 1)
28
+ClustInd <- estimClustNum(dat, 10)
29
+optimalClustNum
30
+}
31
+\references{
32
+Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
33
+
34
+Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
35
+
36
+Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
37
+}
0 38
deleted file mode 100644
... ...
@@ -1,17 +0,0 @@
1
-\name{rcpp_hello_world}
2
-\alias{rcpp_hello_world}
3
-\docType{package}
4
-\title{
5
-Simple function using Rcpp
6
-}
7
-\description{
8
-Simple function using Rcpp
9
-}
10
-\usage{
11
-rcpp_hello_world()	
12
-}
13
-\examples{
14
-\dontrun{
15
-rcpp_hello_world()
16
-}
17
-}
... ...
@@ -4,7 +4,7 @@
4 4
 \alias{runClustWrapper}
5 5
 \title{Wrapper for running cluster analysis}
6 6
 \usage{
7
-runClustWrapper(dat, NClust, proteins = NULL, VSClust = T, cores)
7
+runClustWrapper(dat, NClust, proteins = NULL, VSClust = TRUE, cores)
8 8
 }
9 9
 \arguments{
10 10
 \item{dat}{matrix or data frame with feature values for different conditions}
... ...
@@ -16,7 +16,7 @@ runFuncEnrich(cl, protnames = NULL, idtypes, infosource)
16 16
 \item{infosource}{Type of gene annotation (e.g. KEGG_PATHWAY)}
17 17
 }
18 18
 \value{
19
-list with the items `fullFuncs` clusterProfiler object with all results, `redFuncs` clusterProfiler object with reduce (top 20) results, `BHI` Biological Homogeneity Index
19
+plot object to be able to pass the figures to e.g. shiny
20 20
 }
21 21
 \description{
22 22
 The functional analysis uses the libarary RDAVIDWebService and thus might become obsolete as that library is not supported anymore
23 23
new file mode 100644
... ...
@@ -0,0 +1,24 @@
1
+% Generated by roxygen2: do not edit by hand
2
+% Please edit documentation in R/HelperFuncs.R
3
+\name{runVSClustApp}
4
+\alias{runVSClustApp}
5
+\title{Run VSClust as Shiny app}
6
+\usage{
7
+runVSClustApp()
8
+}
9
+\value{
10
+The shiny app should open in a browser or in RStudio.
11
+}
12
+\description{
13
+You will get the full functionality of the VSClust workflow with multiple visualizations and downloads
14
+}
15
+\examples{
16
+runVSClustApp()
17
+}
18
+\references{
19
+Schwaemmle V, Jensen ON. VSClust: feature-based variance-sensitive clustering of omics data. Bioinformatics. 2018 Sep 1;34(17):2965-2972. doi: 10.1093/bioinformatics/bty224. PMID: 29635359.
20
+
21
+Schwaemmle V, Hagensen CE. A Tutorial for Variance-Sensitive Clustering and the Quantitative Analysis of Protein Complexes. Methods Mol Biol. 2021;2228:433-451. doi: 10.1007/978-1-0716-1024-4_30. PMID: 33950508.
22
+
23
+Schwaemmle V, Jensen ON. A simple and fast method to determine the parameters for fuzzy c-means cluster analysis. Bioinformatics. 2010 Nov 15;26(22):2841-8. doi: 10.1093/bioinformatics/btq534. Epub 2010 Sep 29. PMID: 20880957.
24
+}
0 25
deleted file mode 100644
... ...
@@ -1,188 +0,0 @@
1
-#!/usr/bin/env Rscript
2
-  
3
-library(yaml)
4
-  ############ Command-line wrapper for VSClust
5
-  
6
-  ######## reading parameter file
7
-    args = commandArgs(trailingOnly=TRUE)
8
-  if (length(args) > 1) {
9
-    stop("VSClust can be run either by defining the parameters in the script or by specifying a parameter when the calling runVSClust.R.
10
-    For setting the parameters, see vsclust.yml in the main folder as example and descriptions of the parameter values.", call.=FALSE)
11
-  } else if (length(args) == 1) {
12
-    parfile <- args[1]
13
-    print(paste("Reading",parfile))
14
-    
15
-    ## read all parameters from yaml file + checks
16
-    pars <- yaml.load_file(parfile)
17
-    Experiment <- pars$Experiment
18
-    
19
-    NumReps <- pars$NumReps
20
-    if (!is.integer(NumReps))
21
-      stop("Number of replicates is not a positive integer number", call.=FALSE)
22
-    if (NumReps < 0)
23
-      stop("Number of replicates is not a positive integer number", call.=FALSE)
24
-    NumCond <- pars$NumCond
25
-    if (!is.integer(NumCond)) 
26
-      stop("Number of conditions is not a positive integer number", call.=FALSE)
27
-    if (NumCond < 0) 
28
-      stop("Number of conditions is not a positive integer number", call.=FALSE)
29
-    isPaired <- pars$paired
30
-    if (!is.logical(isPaired)) 
31
-      stop("paired parameter should be 'true' or 'false'")
32
-    isStat <- pars$stat
33
-    if (!is.logical(isStat)) 
34
-      stop("stat parameter should be 'true' or 'false'")
35
-    infile <- pars$infile
36
-    if (!file.exists(infile))
37
-      stop(paste0("input file ",infile," does not exist"), call.=FALSE)
38
-    protnames <- pars$secondcol
39
-    if (!is.logical(protnames)) 
40
-      stop("secondcol parameter should be 'true' or 'false'")
41
-    is_header <- pars$is_header
42
-    if (!is.logical(protnames)) 
43
-      stop("is_header parameter should be 'true' or 'false'")
44
-    cores <- pars$cores
45
-    if (!is.integer(cores)) 
46
-      stop("Parameter cores is not a positive integer number", call.=FALSE)
47
-    if (cores < 1 ) 
48
-      stop("Parameter cores is not a positive integer number > 0", call.=FALSE)
49
-    PreSetNumClustVSClust <- pars$PreSetNumClustVSClust
50
-    if (!is.integer(PreSetNumClustVSClust)) 
51
-      stop("Parameter PreSetNumClustVSClust is not a positive integer number", call.=FALSE)
52
-    if (PreSetNumClustVSClust < 1 & PreSetNumClustVSClust != 0) 
53
-      stop("Parameter PreSetNumClustVSClust is not a positive integer number or 0", call.=FALSE)
54
-    PreSetNumClustStand <- pars$PreSetNumClustStand
55
-    if (!is.integer(PreSetNumClustStand)) 
56
-      stop("Parameter PreSetNumClustStand is not a positive integer number", call.=FALSE)
57
-    if (PreSetNumClustStand < 1 & PreSetNumClustStand != 0) 
58
-      stop("Parameter PreSetNumClustStand is not a positive integer number or 0", call.=FALSE)
59
-    maxClust <- pars$maxClust
60
-    if (!is.integer(maxClust)) 
61
-      stop("Parameter maxClust is not a positive integer number", call.=FALSE)
62
-    if (maxClust < 3) 
63
-      stop("Parameter maxClust should be at least 3", call.=FALSE)
64
-    
65
-  } else {
66
-    
67
-    
68
-    #### Input parameters, only read when now parameter file was provided #####
69
-    # All principal parameters for running VSClust can be defined as in the shiny app at computproteomics.bmb.sdu.dk/Apps/VSClust
70
-    Experiment <- "ProtExample" ## name of study
71
-    NumReps <- 3###886 ## Number of replicates per
72
-    NumCond <- 4###12 ## Number of different experimental conditions (e.g. time points)
73
-    isPaired <- F ## Paired or unpaired statistical tests
74
-    isStat <- T ## Set to F when no replicates but last column with individual standard deviations
75
-    infile <- 'ProtExample.csv'##"/path/MyData.csv" ## Input filename
76
-    protnames <- F ## Low-level data (e.g. probes of transcripts or peptides)
77
-    is_header <- T ## File contains one-line header
78
-    cores <- 4#4 # Number of cores to use ## 1 is for windows
79
-    
80
-    PreSetNumClustVSClust <- 0 # If 0, then automatically take the one from Minimum Centroid Distance
81
-    PreSetNumClustStand <- 0 # If 0, then automatically take the one from Minimum Centroid Distance
82
-    
83
-    
84
-    maxClust <- 20 ## max. number of clusters when estimating the number of clusters
85
-  }
86
-  
87
-  
88
-  ## packages
89
-  library(matrixStats)
90
-  library(Mfuzz)
91
-  library(limma)
92
-  library(parallel)
93
-  library(qvalue)
94
-  library(shiny)
95
-  library(clusterProfiler)
96
-#  library(RDAVIDWebService)
97
-  
98
-  ## reading helper functions
99
-  # need to change to the source path and back
100
-  currPath <- getwd()
101
-  initial.options <- commandArgs(trailingOnly = FALSE)
102
-  file.arg.name <- "--file="
103
-  script.name <- sub(file.arg.name, "", initial.options[grep(file.arg.name, initial.options)])
104
-  script.basename <- dirname(script.name)
105
-  cat(paste0("Getting R functions from files located in ", script.basename),"\n")
106
-  setwd(script.basename)
107
-  source("FcmClustPEst.R")
108
-  source("mfuzz.plotpdf.R")
109
-  source("HelperFuncs.R")
110
-  require(e1071FuzzVec)
111
-  setwd(currPath)
112
-  
113
-  
114
-  
115
-  #### File readin
116
-  
117
-  dat <- read.csv(infile,row.names=1,header=is_header)    
118
-  dat <- dat[rownames(dat)!="",]
119
-  proteins <- NULL
120
-  if(protnames) {
121
-    proteins <- dat[,1]
122
-    dat <- dat[,2:ncol(dat)]
123
-    names(proteins) <- rownames(dat)
124
-  }
125
-  
126
-  
127
-  #### running statistical analysis and estimation of individual variances
128
-  statOut <- statWrapper(dat, NumReps, NumCond, isPaired, isStat)
129
-  
130
-  dat <- statOut$dat
131
-  Sds <- dat[,ncol(dat)]
132
-  print(paste("Features:",nrow(dat),"<br/>Missing values:",
133
-              sum(is.na(dat)),"<br/>Median standard deviations:",
134
-              round(median(Sds,na.rm=T),digits=3)))
135
-  
136
-  ## Write output into file 
137
-  write.csv(statOut$statFileOut,paste("",Experiment,"statFileOut.csv",sep=""))
138
-  
139
-  #### Estimate number of clusters with maxClust as maximum number clusters to test for
140
-  clustNumOut <- estimClustNum(dat, maxClust, cores)
141
-  
142
-  #### Use estimate cluster number or use own
143
-  if (PreSetNumClustVSClust == 0)
144
-    PreSetNumClustVSClust <- clustNumOut$numclust
145
-  if (PreSetNumClustStand == 0)
146
-    PreSetNumClustStand <- clustNumOut$numclust
147
-  
148
-  ## Create pdf-figure of validation indices "minimum centroid distance" and "Xie-Beni index"
149
-  pdf(paste(Experiment,"EstimatedClustNumber.pdf", sep=""),height=6,width=15)
150
-  print(clustNumOut$p)
151
-  dev.off()  
152
-  
153
-  
154
-  #### Run clustering (VSClust and standard fcm clustering
155
-  ClustOut <- runClustWrapper(dat, PreSetNumClustVSClust, proteins, VSClust=T, cores)
156
-  Bestcl <- ClustOut$Bestcl
157
-  ClustOut$p
158
-  ## Write clustering results (VSClust)
159
-  write.csv(data.frame(cluster=Bestcl$cluster,ClustOut$outFileClust,isClusterMember=rowMaxs(Bestcl$membership)>0.5,maxMembership=rowMaxs(Bestcl$membership),
160
-                       Bestcl$membership), paste(Experiment, "FCMVarMResults", Sys.Date(), ".csv", sep=""))
161
-  ## Write coordinates of cluster centroids
162
-  write.csv(Bestcl$centers, paste(Experiment,"FCMVarMResultsCentroids", Sys.Date(), ".csv", sep=""))
163
-  
164
-  ## Write pdf-figure of clusters
165
-                                                                                                                                                                                                                pdf(paste(Experiment,"FCMVarMResults", Sys.Date(), ".pdf", sep=""),height=5*round(sqrt(PreSetNumClustVSClust)),width=5*ceiling(sqrt(PreSetNumClustVSClust)))
166
-  print(ClustOut$p)
167
-  dev.off()
168
-  print(ClustOut$ClustInd)
169
-  
170
-  ClustOut <- runClustWrapper(dat, PreSetNumClustStand, proteins, VSClust=F, cores)
171
-  Bestcl <- ClustOut$Bestcl
172
-  ClustOut$p
173
-  ## Write clustering results (standard fcm)
174
-  write.csv(data.frame(cluster=Bestcl$cluster,ClustOut$outFileClust,isClusterMember=rowMaxs(Bestcl$membership)>0.5,maxMembership=rowMaxs(Bestcl$membership),
175
-                       Bestcl$membership), paste(Experiment, "FCMResults", Sys.Date(), ".csv", sep=""))
176
-  ## Write coordinates of cluster centroids
177
-  write.csv(Bestcl$centers, paste(Experiment,"FCMResultsCentroids", Sys.Date(), ".csv", sep=""))
178
-  
179
-  ## Write pdf-figure of clusters
180
-  pdf(paste(Experiment,"FCMResults", Sys.Date(), ".pdf", sep=""),height=5*round(sqrt(PreSetNumClustStand)),width=5*ceiling(sqrt(PreSetNumClustStand)))
181
-  print(ClustOut$p)
182
-  dev.off()
183
-  print(ClustOut$ClustInd)
184
-  
185
-  
186
-  
187
-  
188
-  
... ...
@@ -10,16 +10,6 @@ Rcpp::Rostream<true>&  Rcpp::Rcout = Rcpp::Rcpp_cout_get();
10 10
 Rcpp::Rostream<false>& Rcpp::Rcerr = Rcpp::Rcpp_cerr_get();
11 11
 #endif
12 12
 
13
-// rcpp_hello_world
14
-List rcpp_hello_world();
15
-RcppExport SEXP _vsclust_rcpp_hello_world() {
16
-BEGIN_RCPP
17
-    Rcpp::RObject rcpp_result_gen;
18
-    Rcpp::RNGScope rcpp_rngScope_gen;
19
-    rcpp_result_gen = Rcpp::wrap(rcpp_hello_world());
20
-    return rcpp_result_gen;
21
-END_RCPP
22
-}
23 13
 // fill_missing_vals_and_ratio
24 14
 void fill_missing_vals_and_ratio(const NumericMatrix& feature_mat, LogicalMatrix& missing_vals, NumericVector& ratio_missing_vals, double missing_value);
25 15
 RcppExport SEXP _vsclust_fill_missing_vals_and_ratio(SEXP feature_matSEXP, SEXP missing_valsSEXP, SEXP ratio_missing_valsSEXP, SEXP missing_valueSEXP) {
... ...
@@ -58,7 +48,6 @@ END_RCPP
58 48
 }
59 49
 
60 50
 static const R_CallMethodDef CallEntries[] = {
61
-    {"_vsclust_rcpp_hello_world", (DL_FUNC) &_vsclust_rcpp_hello_world, 0},
62 51
     {"_vsclust_fill_missing_vals_and_ratio", (DL_FUNC) &_vsclust_fill_missing_vals_and_ratio, 4},
63 52
     {"_vsclust_c_plusplus_means", (DL_FUNC) &_vsclust_c_plusplus_means, 13},
64 53
     {NULL, NULL, 0}
65 54
Binary files a/src/RcppExports.o and b/src/RcppExports.o differ
66 55
deleted file mode 100644
67 56
Binary files a/src/rcpp_hello_world.o and /dev/null differ
68 57
Binary files a/src/vsclust.so and b/src/vsclust.so differ
69 58
new file mode 100644
... ...
@@ -0,0 +1,12 @@
1
+# This file is part of the standard setup for testthat.
2
+# It is recommended that you do not modify it.
3
+#
4
+# Where should you do additional test configuration?
5
+# Learn more about the roles of various files in:
6
+# * https://r-pkgs.org/tests.html
7
+# * https://testthat.r-lib.org/reference/test_package.html#special-files
8
+
9
+library(testthat)
10
+library(vsclust)
11
+
12
+test_check("vsclust")
0 13
new file mode 100644
... ...
@@ -0,0 +1,64 @@
1
+# Both tests check whether most of the clustered feature have been found (50% of the 500 features)
2
+test_that("vsclust_algorithm", {
3
+  data("artificial_clusters")
4
+  dat <- averageCond(artificial_clusters, 5, 10)
5
+  dat <- scale(dat)
6
+
7
+  clust_out <- vsclust_algorithm(dat, centers = 6, m = 1.55)
8
+  expect_equal(    sum(apply(clust_out$membership, 1, max) > 0.5), 200, tolerance = 10)
9
+})
10
+
11
+
12
+test_that("clust_comp", {
13
+  data("artificial_clusters")
14
+  dat <- averageCond(artificial_clusters, 5, 10)
15
+  clust_out <- ClustComp(dat, NClust = 6, Sds = 1)
16
+  sum(apply(clust_out$Bestcl$membership, 1, max) > 0.5)
17
+  expect_equal(  sum(apply(clust_out$Bestcl$membership, 1, max) > 0.5), 214, tolerance = 10)
18
+})
19
+
20
+test_that("sign_analysis_paired", {
21
+  set.seed(0)
22
+  data <- matrix(rnorm(1:1500), nrow=100)
23
+  # make artificial regulations
24
+  data[1:20,c(2,5,8,11,14)] <- data[1:20, c(1,4,7,10,13)] + 3
25
+  data[21:40,c(2,5,8,11,14)] <- data[21:40, c(1,4,7,10,13)] - 3
26
+  # Run statistical testing
27
+  stat_out <- SignAnalysisPaired(data, 3, 5)
28
+  # Histogram of qvalues comparing the second to the first condition
29
+  expect_equal(sum(stat_out$qvalues[,1] < 0.01), 42)
30
+})
31
+
32
+test_that("sign_analysis_unpaired", {
33
+  set.seed(1)
34
+  data <- matrix(rnorm(1:1500), nrow=100)
35
+  # make artificial regulations
36
+  data[1:20,c(2,5,8,11,14)] <- data[1:20,c(2,5,8,11,14)] + 3
37
+  data[21:40,c(2,5,8,11,14)] <- data[21:40,c(2,5,8,11,14)] - 3
38
+  # Run statistical testing
39
+  stat_out <- SignAnalysis(data, 3, 5)
40
+  # Histogram of qvalues comparing the second to the first condition
41
+  expect_equal(sum(stat_out$qvalues[,1] < 0.01), 40)
42
+})
43
+
44
+test_that("prepare_for_vsclust", {
45
+  set.seed(1)
46
+  data <- matrix(rnorm(1:1500), nrow=100)
47
+  # make artificial regulations
48
+  data[1:20,c(2,5,8,11,14)] <- data[1:20,c(2,5,8,11,14)] + 3
49
+  data[21:40,c(2,5,8,11,14)] <- data[21:40,c(2,5,8,11,14)] - 3
50
+  # Run statistical testing
51
+  prepared <- PrepareForVSClust(data, 5,3, isStat=TRUE)
52
+  expect_equal(sum(prepared$statFileOut[,"qvalue BvsA"] < 0.01), 40)
53
+})
54
+
55
+test_that("estimate_clust_num", {
56
+  set.seed(0)
57
+  data("artificial_clusters")
58
+  dat <- averageCond(artificial_clusters, 5, 10)
59
+  dat <- scale(dat)
60
+  dat <- cbind(dat, 1)
61
+  ClustInd <- estimClustNum(dat, 10)
62
+  expect_equal(as.numeric(optimalClustNum(ClustInd, index="MinCentroidDist", method="VSClust")), 6)
63
+})
64
+
0 65
new file mode 100644
... ...
@@ -0,0 +1,575 @@
1
+"","cluster","Mean.of.log.A","Mean.of.log.B","Mean.of.log.C","Mean.of.log.D","isClusterMember","maxMembership","membership.of.cluster.1","membership.of.cluster.2","membership.of.cluster.3"
2
+"Q9WTT7",1,-1.22255561673122,0.776823490992555,0.856334477189782,-0.410602351451118,FALSE,0.342544325994926,0.342544325994926,0.318676072369364,0.33877960163571
3
+"P63102",3,-1.09658973936807,0.830429584823418,0.865356334646909,-0.599196180102253,FALSE,0.345005535490348,0.318646749106913,0.336347715402739,0.345005535490348
4
+"Q7M0E3",1,-0.237751535202779,-1.30795600637204,0.634796914993558,0.910910626581266,FALSE,0.34620764600093,0.34620764600093,0.344366619577612,0.309425734421458
5
+"P62959",3,-1.11147501524251,0.921737797086268,0.764578478326509,-0.57484126017027,FALSE,0.350523210483851,0.326329081078805,0.323147708437344,0.350523210483851
6
+"P02564",1,-1.29124213047911,0.407225819378061,1.06495216321144,-0.180935852110383,FALSE,0.352608812557868,0.352608812557868,0.327604390885696,0.319786796556437
7
+"P05765",3,-1.07423589883272,0.941039458988321,0.756377650063607,-0.623181210219205,FALSE,0.352779928211305,0.320437793622341,0.326782278166354,0.352779928211305
8
+"P70567",3,-1.17907291834308,1.1033623798076,0.479167216325917,-0.403456677790437,FALSE,0.358478689926956,0.358215184582896,0.283306125490148,0.358478689926956
9
+"P18422",3,0.587017403091773,-1.26481732298012,-0.303727981502697,0.981527901391041,FALSE,0.360391157202535,0.324784396401947,0.314824446395518,0.360391157202535
10
+"P11960",2,0.768286653302108,-1.37327190516234,-0.110336827576684,0.715322079436916,FALSE,0.360583420993991,0.285783528680322,0.360583420993991,0.353633050325686
11
+"P62859",3,-1.11086660411474,1.10454447503702,0.52562489384656,-0.519302764768848,FALSE,0.362553477616788,0.340983989666752,0.29646253271646,0.362553477616788
12
+"P15865",2,0.845317841399481,-1.3509015407395,-0.155065561516922,0.660649260856937,FALSE,0.363853823468917,0.278838399619221,0.363853823468917,0.357307776911861
13
+"O35244",3,-0.942600836699279,1.07903247663846,0.616578229663232,-0.753009869602413,FALSE,0.36668335288406,0.307554281942241,0.325762365173699,0.36668335288406
14
+"Q641Y2",3,-0.658721981942087,1.04056760490572,0.648839467451583,-1.03068509041521,FALSE,0.368783244630164,0.269345350999345,0.361871404370492,0.368783244630164
15
+"Q00715",1,-0.975486617619047,-0.704959089890594,1.10433424359156,0.57611146391808,FALSE,0.368981175127371,0.368981175127371,0.335242765199307,0.295776059673322
16
+"Q5M9I5",1,-0.398721199682967,-1.20991980266353,0.600295332589979,1.00834566975651,FALSE,0.372473177758359,0.372473177758359,0.321068483404436,0.306458338837204
17
+"P09456",1,-1.34882690856007,0.633020500223665,0.869646113221733,-0.15383970488533,FALSE,0.372892883060628,0.372892883060628,0.300809409339328,0.326297707600044
18
+"Q4V8H8",2,-0.990376331329471,-0.511646859134656,1.31196408053452,0.19005910992961,FALSE,0.373055230445818,0.330114363324616,0.373055230445818,0.296830406229566
19
+"P29410",1,0.283514062509728,-1.12256801478956,-0.389007210246928,1.22806116252676,FALSE,0.37682013312652,0.37682013312652,0.27411614294451,0.34906372392897
20
+"P10111",1,-1.36070277118647,0.662923511492294,0.831368872284789,-0.133589612590614,FALSE,0.378219785000708,0.378219785000708,0.295163322258001,0.326616892741291
21
+"P18421",3,-0.440627912416783,1.08405540743566,0.521989827727627,-1.1654173227465,FALSE,0.379004159701859,0.251785095671698,0.369210744626443,0.379004159701859
22
+"P31044",3,0.518125805339752,-0.885899999569846,-0.785416238181077,1.15319043241117,FALSE,0.379201690166578,0.364720148277185,0.256078161556237,0.379201690166578
23
+"Q66HG9",3,0.528687527373817,-0.899407350936142,-0.774546156980346,1.14526598054267,FALSE,0.379425433736328,0.362448306477089,0.258126259786583,0.379425433736328
24
+"P02262",3,0.577205983689815,-0.966365457057812,-0.715708269372901,1.1048677427409,FALSE,0.379747745576421,0.351717032855865,0.268535221567714,0.379747745576421
25
+"P21670",3,0.806086873086992,-1.15745324851011,-0.513082652636684,0.864449028059801,FALSE,0.37994946811775,0.307277914654997,0.312772617227253,0.37994946811775
26
+"P29147",3,0.95994417584446,-1.19225678544614,-0.445112954347543,0.677425563949227,FALSE,0.380113848646293,0.282259274964857,0.33762687638885,0.380113848646293
27
+"P52481",3,1.07812861879728,-1.17922044752121,-0.419543459353691,0.520635288077625,FALSE,0.380501152715452,0.264525011911359,0.354973835373189,0.380501152715452
28
+"P84817",3,1.27805083523467,-1.07119723048097,-0.417853541909344,0.210999937155639,FALSE,0.382428343291195,0.235442570704869,0.382129086003936,0.382428343291195
29
+"P97584",1,0.273803667752207,-1.08041827100116,-0.442982941768729,1.24959754501768,FALSE,0.382859926373016,0.382859926373016,0.267372709785844,0.34976736384114
30
+"Q561S0",2,-0.29195595563046,1.03974319256994,0.507611610559439,-1.25539884749892,FALSE,0.38480342065065,0.237871767174701,0.38480342065065,0.377324812174649
31
+"Q04462",1,0.252472592963566,-1.08498771672392,-0.424134765760787,1.25664988952114,FALSE,0.384854549364848,0.384854549364848,0.267215779728029,0.347929670907123
32
+"A7VJC2",2,0.042521075344945,-1.4277086802381,0.677304391903939,0.707883212989214,FALSE,0.386114340418343,0.304293688088414,0.386114340418343,0.309591971493243
33
+"P17074",3,-0.813618258900014,1.25221104136928,0.361139230622043,-0.799732013091312,FALSE,0.387584954097462,0.303578236320433,0.308836809582106,0.387584954097462
34
+"Q80W89",1,-1.38860650766364,0.62745796325888,0.821252679826623,-0.0601041354218674,FALSE,0.387952650965347,0.387952650965347,0.289127560540988,0.322919788493665
35
+"Q66HF1",3,-0.662154669272374,1.21595063242532,0.404890207329366,-0.958686170482312,FALSE,0.389030670212006,0.28166449178133,0.329304838006664,0.389030670212006
36
+"P49134",3,-0.967114563069212,1.36650763374215,0.0427791298065462,-0.442172200479485,FALSE,0.389753091103408,0.352639414360719,0.257607494535873,0.389753091103408
37
+"P36953",2,-1.04471145516165,0.0369296695476287,1.34037224682916,-0.332590461215135,FALSE,0.390647719090688,0.302677295028625,0.390647719090688,0.306674985880687
38
+"P11661",3,1.01400127654449,-1.09525294190164,-0.579423152426748,0.660674817783897,FALSE,0.392195438439886,0.281565116941341,0.326239444618772,0.392195438439886
39
+"P11598",1,0.301084560576599,-0.913710960535612,-0.664980992069462,1.27760739202847,FALSE,0.395162140440818,0.395162140440818,0.247326152560698,0.357511706998484
40
+"Q5XIB3",1,-0.974203733132857,1.39661954883484,-0.285918554631725,-0.136497261070257,FALSE,0.396249968096737,0.396249968096737,0.219140591034327,0.384609440868935
41
+"P21533",1,-1.1610071004706,1.27175679625698,0.064133344864941,-0.174883040651325,FALSE,0.397820714198739,0.397820714198739,0.238559900281665,0.363619385519596
42
+"Q9Z327",3,1.4238473495347,-0.822864036512246,-0.540244687119878,-0.0607386259025733,FALSE,0.399146914136716,0.216926700210245,0.383926385653038,0.399146914136716
43
+"P63159",3,1.06262914289487,-1.01249703502632,-0.674840031796486,0.624707923927939,FALSE,0.402097943764611,0.278588934256727,0.319313121978662,0.402097943764611
44
+"Q9Z2L0",3,0.657315623928304,-0.707989738599222,-0.990882103975011,1.04155621864593,FALSE,0.403218953614142,0.348363245891785,0.248417800494073,0.403218953614142
45
+"P26453",1,-0.928217175921058,1.40351004597353,-0.404410893192759,-0.0708819768597153,FALSE,0.403434609565157,0.403434609565157,0.209876201648831,0.386689188786012
46
+"Q5U2X7",3,0.483365463231436,-0.395542825484475,-1.18541193085588,1.09758929310892,FALSE,0.404266171587002,0.379705636354077,0.216028192058921,0.404266171587002
47
+"P62246",3,0.484040352017557,0.884437145960691,0.0393324435093142,-1.40780994148756,FALSE,0.404474477226746,0.196154638390476,0.399370884382779,0.404474477226746
48
+"P50463",1,-0.927625902520372,1.40167652612515,-0.413732844484173,-0.0603177791206025,FALSE,0.405102045033566,0.405102045033566,0.208778336304836,0.386119618661598
49
+"P04642",2,0.20410079310017,0.947278036467618,0.260423790258789,-1.41180261982658,FALSE,0.405520353696832,0.206664598919905,0.405520353696832,0.387815047383264
50
+"Q642A4",1,-0.990567498090708,1.3838391627856,-0.311600831676004,-0.0816708330188833,FALSE,0.406099964241088,0.406099964241088,0.214075441718555,0.379824594040357
51
+"P52504",3,0.517196670869277,0.871657068685931,0.0155957366629745,-1.40444947621818,FALSE,0.406100379331124,0.194948566804001,0.398951053864875,0.406100379331124
52
+"P85968",3,-0.670588273110441,1.37506139632225,-0.805765134932413,0.101292011720603,FALSE,0.406432885892341,0.4063528928219,0.187214221285759,0.406432885892341
53
+"A0JPQ4",3,-0.798153063530559,1.41456579991769,-0.0149718595747129,-0.601440876812416,FALSE,0.40696645816331,0.326233108516324,0.266800433320366,0.40696645816331
54
+"P62755",3,-0.0389407975291494,1.13744489013407,0.192821775989106,-1.29132586859402,FALSE,0.40708338581822,0.229192601012,0.36372401316978,0.40708338581822
55
+"P05197",3,-0.806680466134843,1.4533670266097,-0.441430446709359,-0.205256113765502,FALSE,0.407893130033353,0.373964570237488,0.21814229972916,0.407893130033353
56
+"Q925F0",3,0.938465018048178,-0.908394733983895,-0.819289550219721,0.789219266155438,FALSE,0.40854799525248,0.300986175884237,0.290465828863283,0.40854799525248
57
+"Q4V8F9",3,-0.735389850308153,1.42648327512408,-0.650130176291942,-0.0409632485239869,FALSE,0.408830922217669,0.390886121501507,0.200282956280824,0.408830922217669
58
+"Q5BK63",2,-0.455949953851938,0.853808422374985,0.797056492788871,-1.19491496131192,FALSE,0.409642603016841,0.240333041269881,0.409642603016841,0.350024355713278
59
+"Q63617",2,0.222054472732967,0.927367280055935,0.27089439680599,-1.42031614959489,FALSE,0.410060524567705,0.20476657497161,0.410060524567705,0.385172900460685
60
+"P11980",3,0.372565811413721,-0.0700343380101918,-1.3367038965113,1.03417242310777,FALSE,0.412346532155563,0.393092030272443,0.194561437571995,0.412346532155563
61
+"A2RRU1",2,1.42513530027703,-0.891863820107753,-0.391893607115268,-0.141377873054013,FALSE,0.412566930360579,0.208322867296351,0.412566930360579,0.37911020234307
62
+"P60901",3,0.999758449581309,0.532449670126365,-0.244975702237386,-1.28723241747029,FALSE,0.413040759998827,0.178298090394984,0.408661149606189,0.413040759998827
63
+"P12368",3,1.29099592677473,0.180253377604296,-0.405056218203893,-1.06619308617513,FALSE,0.413480058456084,0.175149069102409,0.411370872441507,0.413480058456084
64
+"P07895",3,0.186338549751249,0.306350378860213,-1.41896038609356,0.9262714574821,FALSE,0.413865126471287,0.411377064879765,0.174757808648948,0.413865126471287
65
+"O35567",1,-0.0794176151699813,-1.10234583661795,-0.144048226856943,1.32581167864488,FALSE,0.414079617661197,0.414079617661197,0.263164046240845,0.322756336097958
66
+"P63031",3,1.49135080000615,-0.533609962008834,-0.606344815216201,-0.351396022781113,FALSE,0.414301077408,0.200925638162243,0.384773284429757,0.414301077408
67
+"P69897",3,1.45289065868013,-0.680451397169984,-0.638967947908986,-0.133471313601158,FALSE,0.41451939675035,0.214106223556074,0.371374379693576,0.41451939675035
68
+"P05503",1,-1.37323640326891,0.955518608862908,0.447565716305493,-0.0298479218994934,FALSE,0.415069757814993,0.415069757814993,0.252659565509544,0.332270676675462
69
+"Q8CG45",3,1.47145046115324,-0.624139144658676,-0.631400254984229,-0.21591106151033,FALSE,0.415133775048424,0.208960314222446,0.375905910729129,0.415133775048424
70
+"P16290",1,0.276918870971871,-0.0851212638009298,-1.29957590901914,1.1077783018482,FALSE,0.416271129136008,0.416271129136008,0.189280396184926,0.394448474679066
71
+"P24473",1,0.152635238138068,0.345977209942306,-1.41821491756349,0.919602469483118,FALSE,0.416398901107285,0.416398901107285,0.172374705274181,0.411226393618534
72
+"P30427",1,-0.0997799682730416,-1.09555903734175,-0.135602849207248,1.33094185482204,FALSE,0.41670518654385,0.41670518654385,0.261925761722613,0.321369051733537
73
+"P19234",2,-0.238156280128961,0.891942444475275,0.656469030080836,-1.31025519442715,FALSE,0.416927028122646,0.225614939446233,0.416927028122646,0.357458032431121
74
+"P28042",3,-0.345496218280398,1.13256573262833,-1.19608943263915,0.409019918291224,FALSE,0.418073421151788,0.414878166101446,0.167048412746766,0.418073421151788
75
+"P97521",1,-1.22745452042076,1.21876589866509,0.0673019890263837,-0.0586133672707044,FALSE,0.418924581214407,0.418924581214407,0.229877028911502,0.351198389874091
76
+"Q63638",3,0.615481757279154,-0.424605848803438,-1.19604580297424,1.00516989449853,FALSE,0.419112543418846,0.355079130051692,0.225808326529461,0.419112543418846
77
+"P04041",2,-0.89616725763667,0.114745832657532,1.359836070356,-0.578414645376864,FALSE,0.420230086855931,0.274800533197895,0.420230086855931,0.304969379946175
78
+"A2VD12",1,0.216387517496557,-0.735341273088526,-0.807714097180547,1.32666785277252,FALSE,0.421239215902231,0.421239215902231,0.225081993986965,0.353678790110804
79
+"P47727",1,0.278093614538014,-0.410099019281359,-1.10569905628898,1.23770446103232,FALSE,0.421463149176056,0.421463149176056,0.204506816760513,0.374030034063431
80
+"P62832",3,0.868105928023184,0.677624501556055,-0.228541849427491,-1.31718858015175,FALSE,0.421803734042878,0.184172663827324,0.394023602129798,0.421803734042878
81
+"Q5XIF3",3,-0.686652950476595,1.46861271027439,-0.209384312977792,-0.572575446820001,FALSE,0.422647018841955,0.32301110853728,0.254341872620765,0.422647018841955
82
+"O88989",3,1.31147261726968,-0.789297075492299,-0.771340675121424,0.249165133344046,FALSE,0.423631372479019,0.243795391213334,0.332573236307646,0.423631372479019
83
+"P09812",2,0.521983767702376,0.793565524030845,0.127225906946887,-1.44277519868011,FALSE,0.423642596012788,0.189440113366136,0.423642596012788,0.386917290621076
84
+"P36972",2,1.3113962630322,0.117479672727169,-0.36401312008419,-1.06486281567518,FALSE,0.424452394851937,0.172802414125906,0.424452394851937,0.402745191022157
85
+"Q63377",2,0.694862044662732,0.705903448302105,0.0199626836487842,-1.42072817661362,FALSE,0.425630071541072,0.183079595364838,0.425630071541072,0.391290333094089
86
+"P07632",2,0.856061508446359,0.604419080876901,-0.0839684894072711,-1.37651209991599,FALSE,0.425827999547856,0.178332836885284,0.425827999547856,0.39583916356686
87
+"P19945",1,-0.828327352557475,-0.880047244076799,0.654038898391862,1.05433569824241,FALSE,0.425931743862462,0.425931743862462,0.282195594759719,0.291872661377819
88
+"Q920L2",2,0.849139095726594,-1.44475511332672,0.213350213381282,0.382265804218844,FALSE,0.426094826169924,0.246306927570444,0.426094826169924,0.327598246259631
89
+"Q6AXS5",2,-0.0734213683397524,0.875268942905072,0.57555811573419,-1.37740569029951,FALSE,0.426327473111997,0.214462895390378,0.426327473111997,0.359209631497625
90
+"P35281",3,1.23436122770519,0.297701702767411,-0.438833020677535,-1.09322990979507,FALSE,0.426467401177237,0.177919734057126,0.395612864765637,0.426467401177237
91
+"P0C1X8",3,1.26156448337688,0.258704159268722,-0.455241849003986,-1.06502679364161,FALSE,0.426596340066389,0.178001206377928,0.395402453555683,0.426596340066389
92
+"Q505J9",1,0.219255643045472,-0.0307072213378385,-1.30530863973811,1.11676021803047,FALSE,0.428061373589708,0.428061373589708,0.183830291096088,0.388108335314204
93
+"P11951",1,-1.3338251265102,1.07618450897424,0.250368839470242,0.00727177806572177,FALSE,0.428268937974392,0.428268937974392,0.235835602387311,0.335895459638297
94
+"P50503",2,0.395563731917972,0.818380032248664,0.240658262947011,-1.45460202711365,FALSE,0.429341899542702,0.192933797127675,0.429341899542702,0.377724303329624
95
+"P63255",2,-0.507323103447376,0.693138730723931,0.966553899924051,-1.15236952720061,FALSE,0.429542059014375,0.237588642133104,0.429542059014375,0.33286929885252
96
+"P31211",2,-0.827431958207961,-0.314874259283705,1.45539821280822,-0.313091995316558,FALSE,0.432302953772054,0.275993713650755,0.432302953772054,0.291703332577191
97
+"O08730",3,1.31416497032711,0.188825682305777,-0.519304842536431,-0.983685810096455,FALSE,0.432587200906327,0.17994263122282,0.387470167870853,0.432587200906327
98
+"P17764",1,-0.135198790129031,0.794532316434377,-1.36240083730583,0.703067311000481,FALSE,0.433364867333743,0.433364867333743,0.160123034879346,0.406512097786911
99
+"O35763",2,0.931859432282319,0.526071491956477,-0.0996382444133528,-1.35829267982544,FALSE,0.433938320931005,0.174818578746559,0.433938320931005,0.391243100322436
100
+"O35094",3,-0.559064156125634,1.47833051977834,-0.260308296330563,-0.658958067322138,FALSE,0.43480262286919,0.306694893954564,0.258502483176246,0.43480262286919
101
+"Q6P6V0",3,-0.519741286507428,1.40312411993121,-0.872347360577147,-0.0110354728466381,FALSE,0.434829454464941,0.371815588286113,0.193354957248946,0.434829454464941
102
+"Q64536",1,-1.24867078177144,1.19984543131461,0.0247748078984623,0.0240505425583701,FALSE,0.434840579004158,0.434840579004158,0.221163764760838,0.343995656235004
103
+"Q8VBU2",3,1.28786954342104,-0.705845774941151,-0.871441874673088,0.289418106193196,FALSE,0.435050309694049,0.248588347165231,0.316361343140719,0.435050309694049
104
+"P84100",3,1.09399813885662,0.49619439153139,-0.412602437701228,-1.17759009268678,FALSE,0.435663170596647,0.181278504280115,0.383058325123238,0.435663170596647
105
+"P04692",3,0.524222962694514,-0.0673417395369392,-1.3721812179802,0.915299994822626,FALSE,0.436973530217108,0.359680997630934,0.203345472151958,0.436973530217108
106
+"P20070",2,-0.191187100684764,-1.26027754640786,1.12683903482903,0.324625612263595,FALSE,0.43723292019145,0.274298213975164,0.43723292019145,0.288468865833386
107
+"P29266",3,0.750866432895612,0.820549850273136,-0.271790358440313,-1.29962592472843,FALSE,0.437944066417127,0.192074110603501,0.369981822979372,0.437944066417127
108
+"Q63362",3,0.724123291047497,0.841146682965716,-0.261538704480694,-1.30373126953252,FALSE,0.437975233782321,0.193180708400571,0.368844057817108,0.437975233782321
109
+"P68136",1,-0.723198133334644,1.31414364868263,-0.831850716539498,0.240905201191517,FALSE,0.438219111697142,0.438219111697142,0.176877560714572,0.384903327588286
110
+"Q5BK81",1,-0.254565008206742,0.937158477241225,-1.29627414868664,0.613680679652157,FALSE,0.438403233677181,0.438403233677181,0.159276235799467,0.402320530523351
111
+"P26284",3,-0.552048731231546,1.4596723736184,-0.730134478544469,-0.177489163842383,FALSE,0.438859439843159,0.354086326229226,0.207054233927615,0.438859439843159
112
+"P02770",2,-0.676270590076743,-0.684859536878106,1.43795792471005,-0.0768277977552051,FALSE,0.439076237104902,0.275660688290772,0.439076237104902,0.285263074604326
113
+"Q9NQR8",3,-0.10744274387748,0.959313640238656,-1.34933443681078,0.497463540449608,FALSE,0.440190722053958,0.392185173114009,0.167624104832033,0.440190722053958
114
+"Q9R1Z0",3,0.788607483780401,-0.403282914781419,-1.22736601393943,0.842041444940444,FALSE,0.440384544721969,0.323684112899966,0.235931342378065,0.440384544721969
115
+"P84245",2,-0.406534605662114,-1.06526978216782,1.29125155584021,0.180552831989725,FALSE,0.440627508581174,0.274765150672941,0.440627508581174,0.284607340745885
116
+"P03889",3,0.719762247170447,0.855381381699331,-0.282732100463333,-1.29241152840645,FALSE,0.441689300734061,0.194165532853431,0.364145166412508,0.441689300734061
117
+"P07633",1,-0.123189043717616,-0.958574743351368,-0.319598343138577,1.40136213020756,FALSE,0.442939851882693,0.442939851882693,0.238802856721004,0.318257291396303
118
+"P62909",3,-0.503572307087162,1.49330088180059,-0.379352205420729,-0.610376369292696,FALSE,0.443811968679704,0.307015457627271,0.249172573693025,0.443811968679704
119
+"P70615",2,-0.640979130536403,0.432830626234847,1.19497766292747,-0.986829158625919,FALSE,0.443829003335085,0.24283188494651,0.443829003335085,0.313339111718405
120
+"P47942",2,0.0244119384073626,-1.37315030453493,0.9939898240482,0.354748542079372,FALSE,0.443931664059697,0.265438719672797,0.443931664059697,0.290629616267506
121
+"P51650",1,-1.4585861305481,0.762822450486972,0.50374212932785,0.192021550733279,FALSE,0.446450037402646,0.446450037402646,0.241589230793646,0.311960731803708
122
+"Q5XI32",3,0.651412122615601,0.920285644805855,-0.289049305200988,-1.28264846222047,FALSE,0.446563877361891,0.198227527028993,0.355208595609116,0.446563877361891
123
+"Q5XIE6",3,-0.0131078844840037,0.86943634098686,-1.39699326880179,0.540664812298929,FALSE,0.446776834587791,0.38442365381097,0.168799511601238,0.446776834587791
124
+"Q09073",3,-0.354854418232648,1.30594113195523,-1.07400519073979,0.122918477017206,FALSE,0.446937773921931,0.370216357009222,0.182845869068847,0.446937773921931
125
+"P28023",2,1.38354195947944,-1.00752242593757,-0.190735825292979,-0.185283708248888,FALSE,0.447936141534012,0.200312048702187,0.447936141534012,0.351751809763801
126
+"Q63159",2,-0.130838896665075,-1.27672199487876,1.12936727546149,0.278193616082341,FALSE,0.448006342701886,0.265923816237452,0.448006342701886,0.286069841060662
127
+"O35987",3,1.23078203578623,-0.590533116303904,-1.00257844334928,0.362329523866952,FALSE,0.448884229692542,0.256976288787285,0.294139481520173,0.448884229692542
128
+"B2RYW9",3,1.46113771367313,-0.228345988802215,-0.779256190055297,-0.453535534815621,FALSE,0.44999857344257,0.20002386068519,0.349977565872239,0.44999857344257
129
+"P62961",2,-0.0420608702286597,0.769181843032893,0.671388237206508,-1.39850921001074,FALSE,0.450196200766601,0.206406663244458,0.450196200766601,0.34339713598894
130
+"Q9Z270",3,1.30913657253346,-0.557502829597966,-0.964406451602326,0.212772708666834,FALSE,0.450709427260535,0.243613100547247,0.305677472192218,0.450709427260535
131
+"B1PRL5",1,-0.598624199641864,1.2168847923014,-1.00544825159549,0.387187658935953,FALSE,0.450762600545973,0.450762600545973,0.165783872195048,0.383453527258979
132
+"P63324",2,0.778820786981544,0.585460238589606,0.0662053739637651,-1.43048639953492,FALSE,0.450789592450397,0.175144640649337,0.450789592450397,0.374065766900266
133
+"Q68FQ0",3,1.44245405902461,-0.10230459762413,-0.743762475483122,-0.596386985917363,FALSE,0.451291138288235,0.193809453146885,0.35489940856488,0.451291138288235
134
+"Q5I0G4",3,-0.462478175903775,1.45957722939435,-0.780192019109558,-0.216907034381021,FALSE,0.45132412200032,0.340584586433438,0.208091291566242,0.45132412200032
135
+"Q9QZ76",1,0.136490781795837,-0.389930970855571,-1.05590582682842,1.30934601588815,FALSE,0.452422666855488,0.452422666855488,0.194636136256869,0.352941196887643
136
+"P43278",1,-0.963887213220377,-0.728990950287461,0.615597798240325,1.07728036526751,FALSE,0.452530620325018,0.452530620325018,0.262941020287884,0.284528359387099
137
+"P97700",3,-0.426712462367446,1.42728412175252,-0.874588305954145,-0.12598335343093,FALSE,0.452753573199508,0.347013580177091,0.200232846623401,0.452753573199508
138
+"P22062",3,1.14657519362804,-0.53258482332431,-1.08584903662484,0.471858666321115,FALSE,0.453622463278397,0.269093930726007,0.277283605995596,0.453622463278397
139
+"P85972",3,-0.131208127839539,1.38375864101433,-0.249741687977783,-1.00280882519701,FALSE,0.453706042212025,0.255025122255047,0.291268835532928,0.453706042212025
140
+"Q63355",3,1.39227254303094,-0.458228086993823,-0.922754969482947,-0.0112894865541733,FALSE,0.454431245651438,0.226640594454983,0.31892815989358,0.454431245651438
141
+"P04897",2,0.543085071588938,0.686756616838447,0.24448844854177,-1.47433013696915,FALSE,0.454601099782955,0.18159301583101,0.454601099782955,0.363805884386035
142
+"P62902",2,0.401115764156966,0.729811617110601,0.347493804659624,-1.47842118592719,FALSE,0.454636326945126,0.186640125815435,0.454636326945126,0.35872354723944
143
+"Q99J82",3,1.09036734729641,0.544325182035761,-0.518432137010402,-1.11626039232177,FALSE,0.454755351545406,0.185283803103166,0.359960845351428,0.454755351545406
144
+"P0C219",1,-1.13701153338653,1.27059721987052,-0.271566999309857,0.137981312825867,FALSE,0.455713697615221,0.455713697615221,0.198395053177048,0.345891249207731
145
+"Q9JK11",3,1.2227388271462,-0.511854447958883,-1.05908857962475,0.348204200437434,FALSE,0.457094614470329,0.256637658772016,0.286267726757655,0.457094614470329
146
+"P08050",1,-0.978378067259696,1.31207002382211,-0.531245106405444,0.197553149843033,FALSE,0.457512232485702,0.457512232485702,0.185304965456336,0.357182802057961
147
+"P97576",3,-0.41524343848193,1.45575237198778,-0.809242786496914,-0.231266147008938,FALSE,0.457550943236762,0.334296849299319,0.208152207463919,0.457550943236762
148
+"O35854",2,0.56501459940382,-1.48672793406183,0.611887817919841,0.30982551673817,FALSE,0.457809392984409,0.241363585669801,0.457809392984409,0.30082702134579
149
+"P51868",2,-0.723653157350259,-0.0748389075157923,1.43653347016468,-0.638041405298633,FALSE,0.458213317630236,0.250840562334845,0.458213317630236,0.290946120034918
150
+"P41350",2,0.912081265139484,0.475559919216882,0.00588523913774426,-1.39352642349411,FALSE,0.458276202835285,0.170138181058811,0.458276202835285,0.371585616105904
151
+"P14942",2,0.336376881504514,-1.46055795663105,0.808798364835442,0.31538271029109,FALSE,0.458798746552839,0.248140719013719,0.458798746552839,0.293060534433441
152
+"Q3T1J1",2,0.133852908035827,-1.39670067734223,0.973416847081542,0.289430922224862,FALSE,0.459051024963843,0.253321211195441,0.459051024963843,0.287627763840717
153
+"Q6AY30",3,0.202489343231166,0.638563536443384,-1.46875105856131,0.627698178886762,FALSE,0.459277419775421,0.365707887166058,0.175014693058521,0.459277419775421
154
+"Q71LX6",3,1.38185932450224,-0.421500227695758,-0.955394009425395,-0.00496508738108957,FALSE,0.459381375722751,0.227524654302622,0.313093969974628,0.459381375722751
155
+"Q6P502",3,-0.199521122275059,1.19863077330491,-1.21522428261858,0.216114631588723,FALSE,0.459387294888254,0.362744754192339,0.177867950919407,0.459387294888254
156
+"P18420",2,-0.49823678514149,0.469226792514345,1.1394862257753,-1.11047623314816,FALSE,0.459790203073005,0.228350895790034,0.459790203073005,0.311858901136961
157
+"P01048",2,-0.234854167949298,-1.16404835271534,1.25233950454475,0.146563016119883,FALSE,0.460048680181252,0.259423181735856,0.460048680181252,0.280528138082892
158
+"P00564",1,0.0697923341499883,-0.5303866931005,-0.911575274901173,1.37216963385168,FALSE,0.460855676223294,0.460855676223294,0.200127525617289,0.339016798159417
159
+"P16617",3,1.44150893865508,-0.227663629122814,-0.865293545169259,-0.348551764363002,FALSE,0.460949785523518,0.206439845268419,0.332610369208063,0.460949785523518
160
+"Q9ER30",3,0.82354919357449,0.822758894481269,-0.442582521895795,-1.20372556615996,FALSE,0.461111469405108,0.193975262137066,0.344913268457826,0.461111469405108
161
+"Q63416",2,-0.28212840642109,-1.1120391858465,1.29370795495053,0.100459637317061,FALSE,0.462496144106079,0.258288432083202,0.462496144106079,0.27921542381072
162
+"P09605",1,-0.323820337210932,-0.93316928265902,-0.157101787206282,1.41409140707623,FALSE,0.462526405645828,0.462526405645828,0.23449896192282,0.302974632431352
163
+"P62278",3,1.2816891397975,0.29733937581988,-0.684165508538103,-0.894863007079282,FALSE,0.46451878023006,0.18696994543674,0.3485112743332,0.46451878023006
164
+"P02091",2,0.338914789154833,-1.45270270342468,0.834859658407572,0.278928255862271,FALSE,0.465572188504152,0.244096426418235,0.465572188504152,0.290331385077612
165
+"P00388",3,0.514969083728862,0.229720745753188,-1.4688743832705,0.724184553788447,FALSE,0.466372484114653,0.339432368119974,0.194195147765373,0.466372484114653
166
+"Q62871",3,0.962484821604179,-0.297392334120914,-1.27169659361495,0.606604106131684,FALSE,0.466475289275723,0.290439446582984,0.243085264141293,0.466475289275723
167
+"P29975",2,1.10918964351926,0.277930085793798,-0.0892409793006588,-1.2978787500124,FALSE,0.466925436434631,0.164779269336401,0.466925436434631,0.368295294228968
168
+"P09650",2,0.155209512015489,-1.39151144105516,0.989220154105079,0.247081774934592,FALSE,0.467103583923321,0.247888104366109,0.467103583923321,0.285008311710569
169
+"P82995",2,0.227873108522762,0.709255224846857,0.532916266433469,-1.47004459980309,FALSE,0.467301464719265,0.19008743632625,0.467301464719265,0.342611098954485
170
+"P62425",3,-0.191363535544085,1.24601246613443,-1.18104105071426,0.126392120123924,FALSE,0.467910006687078,0.349760098546172,0.18232989476675,0.467910006687078
171
+"B2GV06",1,-1.18192824376596,-0.462874308116883,0.688041155121545,0.956761396761301,FALSE,0.468182846603963,0.468182846603963,0.252885424992304,0.278931728403733
172
+"Q8CFN2",3,1.31692765310314,0.236327759687733,-0.734499581519243,-0.818755831271628,FALSE,0.46839989672963,0.188958831155698,0.342641272114672,0.46839989672963
173
+"P24368",1,-1.4430022988271,0.864617951322675,0.327375528183355,0.251008819321069,FALSE,0.468417008889675,0.468417008889675,0.222896951827849,0.308686039282476
174
+"P18292",2,0.21592647509952,0.699674793030934,0.553304726480143,-1.4689059946106,FALSE,0.469873630018015,0.189883598754498,0.469873630018015,0.340242771227487
175
+"P01835",3,0.7931401985088,-0.098169091674018,-1.37699976781216,0.682028660977373,FALSE,0.469899615605701,0.309171820196422,0.220928564197877,0.469899615605701
176
+"P27605",1,-1.00863580265014,1.28602590868172,-0.51969278552188,0.242302679490303,FALSE,0.470053985742478,0.470053985742478,0.181802338889978,0.348143675367545
177
+"Q4FZT0",3,-0.101062880755208,1.14380902298892,-1.27563676986251,0.2328906276288,FALSE,0.470346487802189,0.351930344519304,0.177723167678507,0.470346487802189
178
+"P49432",1,-0.94148888357518,1.286659476516,-0.618979015333235,0.273808422392411,FALSE,0.470889654506823,0.470889654506823,0.17701454664645,0.352095798846727
179
+"Q5RKI1",3,0.970571046673791,-0.255144250833634,-1.28964030077299,0.57421350493283,FALSE,0.471323617141774,0.287167530025056,0.241508852833171,0.471323617141774
180
+"P97519",3,0.530300241364083,0.253968638566871,-1.47535711943162,0.691088239500664,FALSE,0.471592140004171,0.333902023255445,0.194505836740385,0.471592140004171
181
+"Q64119",2,-0.554223089772288,-0.665148226006098,1.47772407908167,-0.25835276330328,FALSE,0.472130028692247,0.251105854638109,0.472130028692247,0.276764116669643
182
+"Q497B0",1,-1.49634960166187,0.546496270632869,0.549656246529284,0.400197084499716,FALSE,0.473085014023764,0.473085014023764,0.232697568553169,0.294217417423067
183
+"P61589",2,0.712226854361772,0.554183540177929,0.198574782058425,-1.46498517659813,FALSE,0.473790536883999,0.171770457402748,0.473790536883999,0.354439005713253
184
+"Q6AYH5",2,1.26295495769411,0.0660884198564188,-0.155896607850569,-1.17314676969996,FALSE,0.474122995784518,0.1624258613815,0.474122995784518,0.363451142833982
185
+"P05708",3,0.663934423173226,0.102686383812382,-1.44509966164471,0.6784788546591,FALSE,0.474676918127737,0.319558701286585,0.205764380585679,0.474676918127737
186
+"P62804",1,-0.504603414100624,-0.897247365161814,0.00892475504739636,1.39292602421504,FALSE,0.474752212729154,0.474752212729154,0.233433768514024,0.291814018756822
187
+"P47967",2,-0.262263297400804,-1.08312695573393,1.32577111524864,0.0196191378860915,FALSE,0.475395270367065,0.249444084607815,0.475395270367065,0.27516064502512
188
+"P02563",1,-0.0268127992003775,-0.583794186585127,-0.806461989563737,1.41706897534924,FALSE,0.475974777295632,0.475974777295632,0.199121624887237,0.324903597817131
189
+"P24329",3,1.3958620723858,0.00698201191704674,-0.885180802422439,-0.517663281880403,FALSE,0.476219757037088,0.19977596181896,0.324004281143952,0.476219757037088
190
+"Q68FR9",3,0.90059753273327,0.785676656182459,-0.569389075412065,-1.11688511350366,FALSE,0.476468745512212,0.194190738223434,0.329340516264354,0.476468745512212
191
+"P16086",3,0.619749276032991,1.02406388373118,-0.493164169485221,-1.15064899027895,FALSE,0.477800032737817,0.20617302873293,0.316026938529253,0.477800032737817
192
+"P63088",3,0.934382364507242,0.756314980122834,-0.594661125585992,-1.09603621904408,FALSE,0.478376969755871,0.193498789251582,0.328124240992547,0.478376969755871
193
+"Q07803",3,0.581068542455019,0.245833264796872,-1.47647537546803,0.64957356821614,FALSE,0.478573000106745,0.324010204558611,0.197416795334644,0.478573000106745
194
+"P52296",3,1.06900658844428,-0.249744808240528,-1.26381398299482,0.444552202791067,FALSE,0.478614813109431,0.270997668930175,0.250387517960395,0.478614813109431
195
+"P06685",3,1.23837068282774,-0.29885241435084,-1.15378325587032,0.214264987393416,FALSE,0.478691029503347,0.246709331220463,0.27459963927619,0.478691029503347
196
+"Q9EP80",1,-1.47768015573614,0.254113142835235,0.652586389022513,0.570980623878396,FALSE,0.479385145179641,0.479385145179641,0.236618141175322,0.283996713645037
197
+"P80299",1,-0.402198266828379,0.94945407749547,-1.21888687718545,0.671631066518356,FALSE,0.47988128619229,0.47988128619229,0.151636708652428,0.368482005155282
198
+"Q9EQS0",2,0.96281907097593,0.373201605640607,0.0535242672162572,-1.38954494383279,FALSE,0.48122114015006,0.163971286850351,0.48122114015006,0.354807572999589
199
+"Q499N5",2,0.93442879400088,0.393438371070514,0.0744543483902053,-1.4023215134616,FALSE,0.481832034795425,0.164400267297113,0.481832034795425,0.353767697907461
200
+"Q9WU82",3,0.997586224122385,0.697510786382722,-0.645529334368543,-1.04956767613656,FALSE,0.482267852612356,0.192532867057521,0.325199280330123,0.482267852612356
201
+"B2RZ37",1,-0.768871365806504,1.22016864286676,-0.865254255166871,0.413956978106619,FALSE,0.482717735259368,0.482717735259368,0.162880921328295,0.354401343412337
202
+"P27791",2,1.31266645071091,-0.0488858080404664,-0.144065449810621,-1.11971519285982,FALSE,0.485698248196459,0.160327860565007,0.485698248196459,0.353973891238535
203
+"P35745",3,0.245427297553332,0.772124161305991,-1.46425577512131,0.446704316261984,FALSE,0.485878291093655,0.335611589569739,0.178510119336606,0.485878291093655
204
+"Q5XI78",1,-1.33718615888379,1.06819085482938,0.00273605415657945,0.266259249897831,FALSE,0.486109679681935,0.486109679681935,0.200206399530556,0.313683920787509
205
+"Q62812",1,-0.573863282897392,-0.849657553892745,0.0278170043367933,1.39570383245334,FALSE,0.486281347644075,0.486281347644075,0.227593623474501,0.286125028881424
206
+"Q64057",2,1.01103552060703,0.317593365785639,0.0407792637679587,-1.36940815016063,FALSE,0.486866476975508,0.161812461488589,0.486866476975508,0.351321061535902
207
+"Q4V8C3",1,-0.237881180454806,-0.764413941803177,-0.462383993494748,1.46467911575273,FALSE,0.48702454570244,0.48702454570244,0.209786653030144,0.303188801267416
208
+"Q9Z0V6",3,0.156915544469417,0.910384966932221,-1.42162872758755,0.354328216185911,FALSE,0.487680471411122,0.334626663259896,0.177692865328982,0.487680471411122
209
+"P0C546",3,-0.0795023719852119,1.43858518905403,-0.696847113623465,-0.66223570344535,FALSE,0.489142787643888,0.270694664107284,0.240162548248827,0.489142787643888
210
+"P39069",3,1.36375565813091,-0.0142224239084874,-1.01340230072908,-0.336130933493338,FALSE,0.489886603657816,0.209544920513267,0.300568475828917,0.489886603657816
211
+"P08461",3,-0.100312481450952,1.30220859596137,-1.13569708419768,-0.0661990303127416,FALSE,0.490299038507021,0.317300149580908,0.192400811912071,0.490299038507021
212
+"P04797",1,-0.0350871227090812,-0.394646204325311,-0.957883928264705,1.3876172552991,FALSE,0.491119414701328,0.491119414701328,0.184099618493644,0.324780966805028
213
+"Q75Q39",3,0.65187587361257,0.275583114885024,-1.48083856030799,0.553379571810401,FALSE,0.492300899919062,0.306982398927981,0.200716701152957,0.492300899919062
214
+"Q641Z4",3,0.293785731801982,1.26947900729869,-0.58136420987469,-0.981900529225986,FALSE,0.49244971337983,0.230216611044244,0.277333675575927,0.49244971337983
215
+"Q5M7W5",3,-0.119111695683569,1.43152243122662,-0.850299370077205,-0.46211136546585,FALSE,0.492476275567294,0.286479207181354,0.221044517251352,0.492476275567294
216
+"P38650",3,0.616508841843383,0.325109178337739,-1.48837930793847,0.546761287757353,FALSE,0.492974547576971,0.309226419353691,0.197799033069338,0.492974547576971
217
+"P62632",3,0.404357095902588,0.605880660403707,-1.49484454777292,0.484606791466622,FALSE,0.493110474931468,0.322334072446665,0.184555452621867,0.493110474931468
218
+"P21807",2,1.00755050479956,-1.36243020192858,0.358625009979302,-0.00374531285027488,FALSE,0.495039132443692,0.204619326013627,0.495039132443692,0.300341541542682
219
+"P14669",3,0.813613811530261,0.898666695863747,-0.676587382052196,-1.03569312534181,FALSE,0.496370849886452,0.200989943187664,0.302639206925885,0.496370849886452
220
+"Q9EPX0",3,0.733756168975377,0.968231710595509,-0.656381674004518,-1.04560620556637,FALSE,0.496484751696441,0.204357479751427,0.299157768552133,0.496484751696441
221
+"Q02874",2,-0.533725672832341,-0.103696713637454,1.43702024004486,-0.799597853575069,FALSE,0.496915612805935,0.224466764882817,0.496915612805935,0.278617622311248
222
+"Q63258",3,-0.022590897976474,1.41878602133826,-0.775089333105415,-0.621105790256365,FALSE,0.497046979255435,0.268520265182442,0.234432755562123,0.497046979255435
223
+"P52944",1,-1.44365824616963,0.102084773359653,0.618251625094375,0.7233218477156,FALSE,0.497057033578441,0.497057033578441,0.22833411073761,0.274608855683949
224
+"Q63716",1,-1.03152423066447,1.23056444746227,-0.547772491684534,0.348732274886734,FALSE,0.497863207573698,0.497863207573698,0.171632928144432,0.330503864281871
225
+"Q63569",2,1.08833269661863,-1.31313750315304,0.293969524138996,-0.0691647176045851,FALSE,0.49883238111004,0.198979973719455,0.49883238111004,0.302187645170505
226
+"P20760",2,-0.425005494225083,0.192563413252777,1.28994907569098,-1.05750699471867,FALSE,0.49956491558013,0.213155295631282,0.49956491558013,0.287279788788588
227
+"Q5XIJ4",3,-0.0599735127030101,1.36722739659608,-1.0228396619972,-0.284414221895869,TRUE,0.500174469861169,0.293909131424627,0.205916398714204,0.500174469861169
228
+"P07943",1,-0.125686974479761,0.357383505041906,-1.30530994470434,1.07361341414219,TRUE,0.500575264218884,0.500575264218884,0.152933696239057,0.346491039542059
229
+"Q6P9T8",1,-0.0705650788581804,-0.369115111915813,-0.95534398992083,1.39502418069482,TRUE,0.50081538736082,0.50081538736082,0.180095774615235,0.319088838023945
230
+"P60711",1,-1.4128422908071,0.00773150552204512,0.611317446405478,0.793793338879579,TRUE,0.501327993557581,0.501327993557581,0.227078175555365,0.271593830887054
231
+"Q9WUH4",3,-0.0336824751812279,1.34252933362082,-1.06669787046599,-0.242148987973597,TRUE,0.502625475737709,0.2946562183914,0.20271830587089,0.502625475737709
232
+"P40329",3,0.833153665601106,0.17506641758682,-1.44404430814057,0.435824224952646,TRUE,0.503427778433265,0.282173009389835,0.2143992121769,0.503427778433265
233
+"P25113",1,-0.141336993026551,0.370009394473594,-1.30113259623787,1.07246019479083,TRUE,0.50446968995309,0.50446968995309,0.151697050973196,0.343833259073715
234
+"P16036",3,0.283966300393445,0.864276513238112,-1.44393703940052,0.295694225768959,TRUE,0.5048273979461,0.313032271382857,0.182140330671043,0.5048273979461
235
+"Q63799",2,1.33413545605744,-0.154109626414114,-0.0899617531270758,-1.09006407651625,TRUE,0.50563399169678,0.15639427062373,0.50563399169678,0.337971737679491
236
+"Q9JLZ1",3,0.702725020507606,0.339677523977319,-1.48231916118297,0.439916616698041,TRUE,0.506446346441325,0.291052772243721,0.202500881314954,0.506446346441325
237
+"Q5SGE0",3,0.634521771705035,1.06257116815456,-0.729671723708569,-0.967421216151024,TRUE,0.508260238600081,0.211636820986546,0.280102940413373,0.508260238600081
238
+"P17475",2,-0.188431950503736,-1.02019779232277,1.37674510675709,-0.168115363930579,TRUE,0.508672455074032,0.22744726434607,0.508672455074032,0.263880280579897
239
+"P36970",3,0.145448674848607,1.10005973174975,-1.3274057746853,0.0818973680869483,TRUE,0.509133860660963,0.305091431956417,0.18577470738262,0.509133860660963
240
+"P12749",3,0.956313917933676,0.769484222618582,-0.817247616079122,-0.908550524473136,TRUE,0.509164936230393,0.198883646368551,0.291951417401056,0.509164936230393
241
+"P62630",1,-0.729133141911815,1.13331515503016,-0.944479069125027,0.540297056006682,TRUE,0.509320167413629,0.509320167413629,0.152449123682974,0.338230708903398
242
+"P0C2X9",1,-1.00280094333105,1.20795752930497,-0.609620827231152,0.404464241257241,TRUE,0.509914835397277,0.509914835397277,0.165242276170796,0.324842888431927
243
+"P08733",1,-0.0757050126924025,-0.069497985273342,-1.14782810279411,1.29303110075986,TRUE,0.510121908427278,0.510121908427278,0.164227602372417,0.325650489200304
244
+"O88767",3,0.612427601145557,0.487241450032504,-1.49399875697727,0.394329705799209,TRUE,0.511333664805043,0.293085586965977,0.19558074822898,0.511333664805043
245
+"Q6P747",2,1.2051817455036,0.036715690593303,0.00156003589687326,-1.24345747199378,TRUE,0.512898155755346,0.153851263910124,0.512898155755346,0.33325058033453
246
+"P05964",2,0.646413874375567,-1.42297098946132,0.745897201961113,0.0306599131246435,TRUE,0.513417647598647,0.209003138556784,0.513417647598647,0.277579213844569
247
+"O88600",2,1.34706824505792,-0.212309343460355,-0.0691360346563616,-1.06562286694121,TRUE,0.5139997464342,0.154899027338452,0.5139997464342,0.331101226227348
248
+"P38652",1,-1.20368817884026,1.14723154066156,-0.31338614506162,0.369842783240312,TRUE,0.51407168265495,0.51407168265495,0.17615363836205,0.309774678983
249
+"P10760",3,0.672820866833128,1.03756531575136,-0.791711401350385,-0.918674781234098,TRUE,0.515102070372884,0.211151666461386,0.27374626316573,0.515102070372884
250
+"P45953",1,-1.13707370631782,1.1744480942933,-0.423061177926636,0.38568678995115,TRUE,0.515578922964553,0.515578922964553,0.17107395516112,0.313347121874326
251
+"Q9Z1P2",2,-0.125135311419987,0.381364953744286,1.05638404145626,-1.31261368378056,TRUE,0.517872431109666,0.190958077184069,0.517872431109666,0.291169491706265
252
+"P63029",3,0.841328519368094,0.306937173861929,-1.45125850542196,0.302992812191932,TRUE,0.51854045820323,0.269169542117813,0.212289999678957,0.51854045820323
253
+"P62828",3,1.08615610447503,0.150545905438982,-1.33699031518311,0.100288305269096,TRUE,0.519050795036571,0.242555205761727,0.238393999201702,0.519050795036571
254
+"P53987",3,0.190682500449899,1.32298080922427,-0.940915406047772,-0.572747903626395,TRUE,0.519123413152374,0.254184435123889,0.226692151723736,0.519123413152374
255
+"Q9Z269",3,0.591584816793317,1.10202872335531,-0.82038059221885,-0.873232947929777,TRUE,0.5191731041188,0.216703681414052,0.264123214467149,0.5191731041188
256
+"Q5RKI0",1,-1.30284284624402,1.05927134854635,-0.152878765508441,0.396450263206107,TRUE,0.521250104236175,0.521250104236175,0.180363554747624,0.298386341016201
257
+"P04785",3,0.329939307396937,0.951239594020021,-1.40399419246906,0.1228152910521,TRUE,0.522339310670571,0.290361660107131,0.187299029222298,0.522339310670571
258
+"Q9QY17",3,0.7153134665451,1.00461041382569,-0.862744374132729,-0.857179506238064,TRUE,0.522673429726362,0.210834736031042,0.266491834242596,0.522673429726362
259
+"P62856",2,-0.152396877788254,0.328294406581949,1.10652350483537,-1.28242103362907,TRUE,0.52302625750613,0.190791039125108,0.52302625750613,0.286182703368762
260
+"Q3T1K5",1,-1.48313368681763,0.33006314771966,0.461237933334557,0.691832605763415,TRUE,0.523498884207869,0.523498884207869,0.207965356913873,0.268535758878257
261
+"P04639",2,0.677884923135875,0.414986278887402,0.39459433666685,-1.48746553869013,TRUE,0.524033277173153,0.160210186602765,0.524033277173153,0.315756536224083
262
+"B0LPN4",2,1.3042496787138,-0.162345425779799,-0.0139045176986983,-1.1279997352353,TRUE,0.525568663556256,0.151502961810427,0.525568663556256,0.322928374633317
263
+"P07335",2,1.30871692608124,-1.0524628671515,0.142750109932985,-0.399004168862721,TRUE,0.52573834934518,0.17411855731072,0.52573834934518,0.300143093344099
264
+"Q68FX0",3,0.743791286290024,0.469361573366731,-1.46988526953728,0.256732409880524,TRUE,0.525790860012883,0.27044511602162,0.203764023965497,0.525790860012883
265
+"P11507",2,1.0836554678088,0.14055272727641,0.114735948645809,-1.33894414373102,TRUE,0.525821833918881,0.151649676938529,0.525821833918881,0.32252848914259
266
+"P23693",1,-0.187491861704529,-0.393516382974135,-0.858670879114588,1.43967912379325,TRUE,0.526255185695595,0.526255185695595,0.174292406366147,0.299452407938259
267
+"P20767",2,-0.402545986448142,-0.323937810460321,1.47435207979616,-0.747868282887699,TRUE,0.5267071176255,0.21015766299966,0.5267071176255,0.26313521937484
268
+"P07150",2,1.28290451090511,-1.08985116702453,0.175268888033425,-0.368322231914007,TRUE,0.52702528523491,0.17538095419173,0.52702528523491,0.29759376057336
269
+"Q7TPB1",3,1.0624155063188,0.260068023185278,-1.34284156388093,0.0203580343768552,TRUE,0.527951658125191,0.237423577025493,0.234624764849316,0.527951658125191
270
+"P00406",1,-1.47943676495414,0.663095302679733,0.2696702138964,0.546671248378007,TRUE,0.528200853677716,0.528200853677716,0.196185382835103,0.275613763487181
271
+"P15651",1,-0.890769242129233,-0.619910917672807,0.171746326157539,1.3389338336445,TRUE,0.528421339078792,0.528421339078792,0.2083759658595,0.263202695061708
272
+"P68511",1,-0.798055082617286,-0.660698360641532,0.0726404894765839,1.38611295378223,TRUE,0.528785125347996,0.528785125347996,0.205882935083926,0.265331939568077
273
+"Q62930",2,-0.0184667811548216,-1.11079712957078,1.31568795357381,-0.186424042848207,TRUE,0.528909403709374,0.213946381182276,0.528909403709374,0.25714421510835
274
+"Q6PDU7",1,-0.196347107405575,-0.379932981038088,-0.86317428582984,1.4394543742735,TRUE,0.529535449374882,0.529535449374882,0.172679064356946,0.297785486268173
275
+"Q924S5",3,1.05442180351119,0.286468994771267,-1.34392001219493,0.0030292139124756,TRUE,0.529933807208851,0.236437630520247,0.233628562270902,0.529933807208851
276
+"P68035",1,-0.261905544270804,-0.498690591813308,-0.713653470739271,1.47424960682338,TRUE,0.530186443908714,0.530186443908714,0.179167866585256,0.29064568950603
277
+"P62083",2,1.03259857425831,0.175598603543809,0.161745750585979,-1.3699429283881,TRUE,0.530529442282272,0.151139042250199,0.530529442282272,0.318331515467529
278
+"Q5I0C3",1,-0.621357185331289,-0.687884989422374,-0.146525576314565,1.45576775106823,TRUE,0.530711369656048,0.530711369656048,0.199000829741679,0.270287800602272
279
+"P97541",1,-0.97693066423971,-0.559802028816361,0.243268983723973,1.2934637093321,TRUE,0.531058927894818,0.531058927894818,0.208401170788961,0.260539901316222
280
+"P61206",2,0.28526642814357,0.454508253382566,0.734289280721871,-1.47406396224801,TRUE,0.531529183923959,0.170298547926732,0.531529183923959,0.298172268149309
281
+"Q07439",3,0.862466499703706,0.427304224703055,-1.43286010027288,0.143089375866117,TRUE,0.532733020269659,0.254232147433727,0.213034832296613,0.532733020269659
282
+"P27952",3,0.961905524020887,0.359291482633127,-1.39301458321931,0.0718175765653004,TRUE,0.532855439165727,0.244482109770533,0.22266245106374,0.532855439165727
283
+"Q6RUV5",2,1.05643402751295,0.146727079773443,0.152945782719761,-1.35610689000615,TRUE,0.532926194152839,0.150238957884546,0.532926194152839,0.316834847962615
284
+"P29418",1,-0.167530871978176,-0.227053025081898,-0.994876685687839,1.38946058274791,TRUE,0.533101564064589,0.533101564064589,0.164445446837574,0.302452989097837
285
+"Q63270",3,0.333460994601858,1.22522462383142,-1.0733478752282,-0.485337743205076,TRUE,0.533670257160466,0.247511778702123,0.218817964137411,0.533670257160466
286
+"Q9JLJ3",3,0.305336219894994,1.19850115939848,-1.16398745336258,-0.33984992593089,TRUE,0.534553554924837,0.257391419139353,0.20805502593581,0.534553554924837
287
+"Q9QWN8",2,0.537310057288955,0.421651351975514,0.538778728784445,-1.49774013804891,TRUE,0.535224287315327,0.161153714137496,0.535224287315327,0.303621998547177
288
+"P63245",2,0.800249147274074,-1.3767364425039,0.674267785064973,-0.0977804898351472,TRUE,0.536021113940235,0.192917660991567,0.536021113940235,0.271061225068199
289
+"Q5I0K3",3,0.966957100596458,0.727402116859742,-1.07129291389388,-0.623066303562316,TRUE,0.537314814541567,0.207316359962796,0.255368825495637,0.537314814541567
290
+"P05508",2,0.933293948421451,0.234674396408758,0.25022662416073,-1.41819496899094,TRUE,0.537797934707032,0.15090603610641,0.537797934707032,0.311296029186558
291
+"Q68FS4",1,-0.189784260054557,-0.231110040310402,-0.977406813456026,1.39830111382098,TRUE,0.538948568199442,0.538948568199442,0.162998288526298,0.29805314327426
292
+"Q78P75",2,0.983307677905425,0.191427891032889,0.22085852809513,-1.39559409703344,TRUE,0.5396052509578,0.149606999278219,0.5396052509578,0.31078774976398
293
+"P41562",1,-0.768220641568104,1.07708462548251,-0.929682685326178,0.620818701411769,TRUE,0.539832357616193,0.539832357616193,0.144454908094384,0.315712734289423
294
+"P62198",1,-1.48578407644085,0.458230935720076,0.348644260921328,0.678908879799445,TRUE,0.540293511909016,0.540293511909016,0.195429907918599,0.264276580172385
295
+"P25886",3,0.747505797435708,0.612199345127119,-1.4355138734764,0.0758087309135692,TRUE,0.540440652312142,0.254676563529629,0.204882784158229,0.540440652312142
296
+"P62853",1,-0.210996767304818,-0.260664706358473,-0.942367464273936,1.41402893793723,TRUE,0.542790980451679,0.542790980451679,0.163239380801001,0.29396963874732
297
+"Q63704",1,-1.38721342397836,0.00626154270392772,0.443407468124519,0.937544413149911,TRUE,0.543507608780009,0.543507608780009,0.201569558252159,0.254922832967832
298
+"Q5XIM9",2,1.29156669513146,-0.201371932514382,0.0452595050762073,-1.13545426769328,TRUE,0.543513040279825,0.147251365969654,0.543513040279825,0.309235593750521
299
+"Q5U300",1,-0.222349946851389,-0.289018159268012,-0.91399118707545,1.42535929319485,TRUE,0.543650089479488,0.543650089479488,0.164297984219086,0.292051926301426
300
+"O35878",1,-1.36655654286555,-0.0420760931990507,0.441039025202742,0.967593610861856,TRUE,0.543669778341317,0.543669778341317,0.201953664750141,0.254376556908541
301
+"Q5XI73",3,0.703335293381523,0.69438526211049,-1.42216422396268,0.0244436684706651,TRUE,0.543693327546291,0.253195683887975,0.203110988565734,0.543693327546291
302
+"P11517",2,0.45818689951494,-1.33958907498564,0.991668862577832,-0.110266687107128,TRUE,0.544308234337365,0.197876803679796,0.544308234337365,0.257814961982839
303
+"P12007",2,1.08825267729644,-1.25325768989134,0.422677421594451,-0.257672408999547,TRUE,0.544474994059146,0.178168035179499,0.544474994059146,0.277356970761355
304
+"Q9JM53",1,-0.825538455960121,-0.602350114046033,0.0297558191317942,1.39813275087436,TRUE,0.545393037590458,0.545393037590458,0.196218501416793,0.258388460992749
305
+"Q4G069",2,1.31219701807565,-0.997970649526584,0.184079183086686,-0.498305551635749,TRUE,0.546222376993299,0.164900525219789,0.546222376993299,0.288877097786912
306
+"P62282",3,0.902809750274333,0.742355741223915,-1.19712096881397,-0.448044522684274,TRUE,0.548380443230837,0.216259546986045,0.235360009783118,0.548380443230837
307
+"P0CG51",1,-1.42281826509725,0.124287889190763,0.407345638794595,0.891184737111889,TRUE,0.551384159111349,0.551384159111349,0.195608459373761,0.25300738151489
308
+"P10959",2,0.588138371564071,-1.34990669168875,0.901316524954791,-0.139548204830107,TRUE,0.551993548728198,0.190968920421042,0.551993548728198,0.25703753085076
309
+"P97532",2,1.38156794344043,-0.688562095462086,0.0876765928495033,-0.780682440827852,TRUE,0.555559628648411,0.15207844500473,0.555559628648411,0.292361926346859
310
+"P50753",1,-0.252765265787015,-0.235628931438395,-0.930818705778685,1.4192129030041,TRUE,0.555823549993563,0.555823549993563,0.158480732794026,0.285695717212411
311
+"P18266",1,-1.46558429178467,0.639160053570951,0.187326529881207,0.639097708332513,TRUE,0.556179799262199,0.556179799262199,0.181737645059549,0.262082555678252
312
+"Q5XIT9",1,-0.305147632512247,-0.3647066519782,-0.794125912121558,1.46398019661201,TRUE,0.55624374587791,0.55624374587791,0.164508733377273,0.279247520744818
313
+"P08010",2,1.29791388180563,-0.994615312919407,0.222626632347056,-0.525925201233283,TRUE,0.557197633927964,0.161128681135338,0.557197633927964,0.281673684936697
314
+"P50399",1,-0.9544226834536,1.09904990646176,-0.73212726989488,0.587500046886722,TRUE,0.559558392119484,0.559558392119484,0.145298567929077,0.295143039951438
315
+"P62076",1,-0.516422992830342,0.797668375503833,-1.15489163312675,0.873646250453264,TRUE,0.560710851937043,0.560710851937043,0.133426256339801,0.305862891723156
316
+"P07871",1,-1.13462557060349,1.08530023761622,-0.49183114495319,0.541156477940463,TRUE,0.562421951360987,0.562421951360987,0.152904768359758,0.284673280279255
317
+"P26644",2,-0.18142369944573,-0.046129600413803,1.32601986997816,-1.09846657011863,TRUE,0.563190774326447,0.181606371704554,0.563190774326447,0.255202853968999
318
+"P35704",2,0.608709082732501,-1.32824145137973,0.910395135919007,-0.190862767271781,TRUE,0.563675378885333,0.184648217229064,0.563675378885333,0.251676403885603
319
+"Q9EQX9",1,-0.683348229493468,-0.56950281760202,-0.217340991812806,1.47019203890829,TRUE,0.564105405360724,0.564105405360724,0.180679838792802,0.255214755846474
320
+"P50878",2,0.663423439439013,0.292640425534987,0.526259326160386,-1.48232319113439,TRUE,0.564546553202875,0.149642742725569,0.564546553202875,0.285810704071556
321
+"P19804",2,0.983718307210816,0.117568727787527,0.289612193453449,-1.39089922845179,TRUE,0.564943384266774,0.143086401013148,0.564943384266774,0.291970214720079
322
+"P29117",1,-0.273365045923739,0.226397644372468,-1.17503886678108,1.22200626833235,TRUE,0.56619032703582,0.56619032703582,0.139763685869419,0.294045987094761
323
+"P80432",1,-0.465807686514058,0.706489302275282,-1.18216288451876,0.941481268757534,TRUE,0.56626169847611,0.56626169847611,0.132111074515548,0.301627227008342
324
+"Q8VID1",1,-1.13989967801832,-0.333455602122196,0.234657623184426,1.23869765695609,TRUE,0.568230313398503,0.568230313398503,0.188115199471798,0.243654487129699
325
+"P56741",1,-0.466576815510493,-0.481388901237946,-0.551017458925199,1.49898317567364,TRUE,0.568384549358055,0.568384549358055,0.16851973470463,0.263095715937316
326
+"P62268",1,-1.17123237595056,-0.298629652425309,0.255980149804675,1.21388187857119,TRUE,0.568617123561659,0.568617123561659,0.188114470496754,0.243268405941587
327
+"P14882",2,1.05246188612569,-1.23292864125681,0.512090473610902,-0.331623718479786,TRUE,0.568719462960325,0.168736543283111,0.568719462960325,0.262543993756564
328
+"P24049",1,-1.44768380493906,0.67905263983675,0.112560012907536,0.65607115219477,TRUE,0.569154743050238,0.569154743050238,0.173640653888489,0.257204603061274
329
+"Q63065",2,0.0618231831691719,0.207214335769613,1.07317522490248,-1.34221274384127,TRUE,0.569197957457423,0.16757886317612,0.569197957457423,0.263223179366458
330
+"P23514",1,-0.874598615199346,-0.506593661460024,-0.0251531445578931,1.40634542121726,TRUE,0.572408288825058,0.572408288825058,0.181396750875839,0.246194960299103
331
+"P62836",1,-0.78650523727053,-0.522089634730003,-0.137100585080301,1.44569545708083,TRUE,0.575740686392071,0.575740686392071,0.177186325154005,0.247072988453925
332
+"P62898",1,-0.287887149406363,-0.0549052405836734,-1.02345799955041,1.36625038954044,TRUE,0.576375611164304,0.576375611164304,0.145575936497984,0.278048452337712
333
+"P11250",1,-0.59107029448575,-0.506463269412623,-0.397763962868612,1.49529752676699,TRUE,0.577212893275725,0.577212893275725,0.169454071289788,0.253333035434486
334
+"P62890",2,0.926403337077201,0.124373122992671,0.361810338159014,-1.41258679822889,TRUE,0.577301408778714,0.140677536083631,0.577301408778714,0.282021055137655
335
+"Q5XIG4",1,-0.300333451638261,0.191172936765903,-1.14276988288864,1.251930397761,TRUE,0.578608619131339,0.578608619131339,0.137367037540107,0.284024343328553
336
+"P17702",1,-1.25236968612297,-0.170035975090315,0.26902695839654,1.15337870281675,TRUE,0.579323948558603,0.579323948558603,0.182198521630122,0.238477529811275
337
+"P62703",1,-1.42004877362002,0.741565259607286,0.020358936137696,0.658124577875038,TRUE,0.580329200456346,0.580329200456346,0.165740248315063,0.253930551228592
338
+"Q5XHZ0",1,-0.296574095675679,0.0508057301762476,-1.07696196130695,1.32273032680638,TRUE,0.581060732563947,0.581060732563947,0.140747453504372,0.278191813931681
339
+"P06399",2,-0.0612782451964428,-0.770507479275509,1.42995140475916,-0.598165680287207,TRUE,0.582161130177811,0.182809821806392,0.582161130177811,0.235029048015796
340
+"P30009",2,1.30231981507758,-0.402459114903677,0.15715906681493,-1.05701976698883,TRUE,0.58351067239488,0.138522659219668,0.58351067239488,0.277966668385453
341
+"Q66H98",2,1.2155479347593,-0.208529947284694,0.193597836611944,-1.20061582408655,TRUE,0.583934906056566,0.1367796634029,0.583934906056566,0.279285430540533
342
+"P20059",2,-0.0267638237320822,-0.816942812229043,1.41582708410926,-0.572120448148132,TRUE,0.584668257000393,0.181600883577742,0.584668257000393,0.233730859421865
343
+"P34064",2,-0.112467051915412,-0.612979266679844,1.44634472614474,-0.720898407549486,TRUE,0.584780125467357,0.180140201079658,0.584780125467357,0.235079673452985
344
+"P14480",2,-0.0907631949489523,-0.66583164858452,1.44183218367045,-0.685237340136973,TRUE,0.585957266312038,0.179969701151492,0.585957266312038,0.23407303253647
345
+"P46462",1,-0.818871342991928,0.992382909837861,-0.902100113130873,0.72858854628494,TRUE,0.585981543445851,0.585981543445851,0.132082712285483,0.281935744268666
346
+"P11608",1,-1.44366298618524,0.605500295924797,0.10447983028852,0.733682859971923,TRUE,0.587546391465697,0.587546391465697,0.166459265556337,0.245994342977966
347
+"P83732",1,-0.317472537614832,0.0885287910554093,-1.082433766583,1.31137751314242,TRUE,0.588374991934919,0.588374991934919,0.137569720840826,0.274055287224254
348
+"P48679",2,1.31470890802267,-0.801484641816074,0.242117895262323,-0.755342161468919,TRUE,0.591008499308753,0.144064332072004,0.591008499308753,0.264927168619243
349
+"Q9WVK7",1,-0.325989379400244,0.0233738739010767,-1.04188052125684,1.344496026756,TRUE,0.591275929237946,0.591275929237946,0.138760216912006,0.269963853850048
350
+"P23562",2,0.546266988589785,-1.248003765712,1.02089142016628,-0.319154643044071,TRUE,0.593129982554817,0.171484224778296,0.593129982554817,0.235385792666887
351
+"P16409",1,-0.975974365973671,-0.401368409620039,0.00389373191821932,1.37344904367549,TRUE,0.59350863185742,0.59350863185742,0.171647721521106,0.234843646621475
352
+"P62271",2,0.0854748796023107,0.0812866374284336,1.13567252697943,-1.30243404401018,TRUE,0.593734697288888,0.159288643086377,0.593734697288888,0.246976659624735
353
+"P06761",1,-1.42387868722725,0.673319488498184,0.0306487859785608,0.719910412750502,TRUE,0.594621238227526,0.594621238227526,0.160867419720159,0.244511342052315
354
+"P38718",2,0.178123553838043,0.121633850559722,1.05605453708522,-1.35581194148298,TRUE,0.598948807228299,0.154086791936372,0.598948807228299,0.246964400835329
355
+"Q99NA5",1,-0.580187168589801,0.74511314966662,-1.10583705557537,0.940911074498555,TRUE,0.600267081699446,0.600267081699446,0.123905778746356,0.275827139554198
356
+"P13221",1,-1.1224818875927,-0.273927564884718,0.110829879254903,1.28557957322252,TRUE,0.600640042247918,0.600640042247918,0.169795679778422,0.22956427797366
357
+"P04276",2,0.0148307821100795,-0.761473927006031,1.40801947847706,-0.661376333581112,TRUE,0.602699939107604,0.171391427431898,0.602699939107604,0.225908633460497
358
+"Q07936",2,1.2162882689319,-0.286503049997499,0.244441082290886,-1.17422630122529,TRUE,0.603875622386795,0.131805099189194,0.603875622386795,0.264319278424012
359
+"Q704S8",1,-1.1708652328928,0.986630708690962,-0.472977097770467,0.65721162197231,TRUE,0.605451527646062,0.605451527646062,0.139293882351365,0.255254590002574
360
+"Q62736",2,-0.00444423298826263,-0.691728306745138,1.41559835314755,-0.719425813414146,TRUE,0.605552551026122,0.16941010475386,0.605552551026122,0.225037344220018
361
+"P27139",2,0.39048467889667,-1.14392996813123,1.1689050862377,-0.415459797003141,TRUE,0.607568324673855,0.166892990006966,0.607568324673855,0.225538685319179
362
+"B0BNE5",2,0.5619290649879,-1.20431251431397,1.03796883290679,-0.39558538358072,TRUE,0.611925221969167,0.162083553863545,0.611925221969167,0.225991224167288
363
+"Q63798",2,0.480211732431078,0.15571451110359,0.809633567980214,-1.44555981151488,TRUE,0.613001243516223,0.140264959904273,0.613001243516223,0.246733796579504
364
+"P13086",1,-0.491206664955999,-0.264756821418305,-0.718120314435605,1.47408380080991,TRUE,0.613745905552924,0.613745905552924,0.143539535976497,0.242714558470579
365
+"P31000",2,0.0979410436793736,-0.833309874393075,1.37406867263867,-0.638699841924972,TRUE,0.613915145927019,0.165591315637979,0.613915145927019,0.220493538435001
366
+"P29314",1,-1.4241520833368,0.432312680389291,0.113150914029928,0.878688488917583,TRUE,0.615142322375222,0.615142322375222,0.156790852079703,0.228066825545075
367
+"P61980",2,1.28512705913331,-0.585331025514121,0.266940206762592,-0.966736240381781,TRUE,0.615595094116407,0.131881147140633,0.615595094116407,0.252523758742961
368
+"P11915",1,-1.23484836506617,-0.106458011927366,0.139491815415058,1.20181456157848,TRUE,0.61620722037763,0.61620722037763,0.162006321858246,0.221786457764124
369
+"Q99PS8",2,0.873425984156391,-1.20645703369901,0.769065786599691,-0.436034737057076,TRUE,0.616646827315681,0.152986988785493,0.616646827315681,0.230366183898826
370
+"Q4QQT4",2,0.0402508693423748,-0.695572132878278,1.40000299693385,-0.74468173339795,TRUE,0.616719639473627,0.16344914113432,0.616719639473627,0.219831219392053
371
+"P09006",2,0.0251629809272163,-0.635286016383908,1.40270750860621,-0.792584473149514,TRUE,0.61821355917144,0.162177693458704,0.61821355917144,0.219608747369856
372
+"Q02253",1,-1.38332891742223,0.705245497454493,-0.084710182239651,0.76279360220739,TRUE,0.621038279959422,0.621038279959422,0.146898314786281,0.232063405254298
373
+"P81155",1,-0.45437280199218,-0.149877749807794,-0.835530790810652,1.43978134261063,TRUE,0.62137294530948,0.62137294530948,0.136247431136034,0.242379623554486
374
+"P20761",2,1.25414499282135,-0.472901286199923,0.279569852816653,-1.06081355943808,TRUE,0.6213760192316,0.128547553606913,0.6213760192316,0.250076427161487
375
+"P04762",1,-1.17665763556217,0.950518518461888,-0.472772529641214,0.698911646741496,TRUE,0.621836599051379,0.621836599051379,0.133818112930391,0.24434528801823
376
+"P10860",1,-1.24546504676826,0.905248286711624,-0.364432841381446,0.704649601438082,TRUE,0.623490102589744,0.623490102589744,0.136670050642184,0.239839846768072
377
+"P02401",1,-1.32729837485102,0.0744205458635489,0.153211073339472,1.099666755648,TRUE,0.62362061417678,0.62362061417678,0.157428491248419,0.218950894574802
378
+"P02651",2,0.908514198456601,-1.17523835602384,0.748929243932219,-0.48220508636498,TRUE,0.626318978200648,0.147682858362943,0.626318978200648,0.225998163436409
379
+"P07340",2,1.08387060678733,-0.167734548356789,0.371822623296161,-1.2879586817267,TRUE,0.626633256522443,0.125495338642137,0.626633256522443,0.247871404835421
380
+"P02680",2,0.0739924899379389,-0.682732467077885,1.38675608187179,-0.778016104731848,TRUE,0.626772827790751,0.158052727761415,0.626772827790751,0.215174444447834
381
+"Q2TA68",1,-0.458730967076316,-0.113103111523554,-0.85716573969834,1.42899981829821,TRUE,0.627094101920665,0.627094101920665,0.133164294028668,0.239741604050667
382
+"P18418",2,0.382490457142129,0.0804148684808296,0.939037368943889,-1.40194269456685,TRUE,0.628030557976285,0.138401721652177,0.628030557976285,0.233567720371538
383
+"B0BNN3",2,0.390558126887882,-1.0686431425499,1.19798561979193,-0.519900604129914,TRUE,0.630559015959609,0.155519240826733,0.630559015959609,0.213921743213658
384
+"P56571",1,-0.451176814948704,-0.0449160819376839,-0.907671498563243,1.40376439544963,TRUE,0.631516491637179,0.631516491637179,0.129446344940672,0.239037163422149
385
+"Q62651",1,-1.15280996392757,0.938932406834555,-0.512158676524643,0.726036233617657,TRUE,0.632073838919981,0.632073838919981,0.129196043620817,0.238730117459202
386
+"Q68FT1",2,1.0953420321444,-1.04839999668325,0.568129143791432,-0.61507117925258,TRUE,0.634698459529758,0.137971811315651,0.634698459529758,0.227329729154592
387
+"P23764",2,1.14076870532357,-0.995727031920226,0.517672307678158,-0.662713981081502,TRUE,0.635816191316664,0.135602080690088,0.635816191316664,0.228581727993248
388
+"P42930",1,-1.39057076074652,0.603721914117707,-0.0494453408659702,0.836294187494779,TRUE,0.636355013649676,0.636355013649676,0.142600404957186,0.221044581393138
389
+"Q01177",2,1.24932283618298,-0.699201362739387,0.356996652904822,-0.907118126348413,TRUE,0.636782060943787,0.127492920740841,0.636782060943787,0.235725018315371
390
+"Q9JJW3",1,-0.588897268266176,-0.252317692185216,-0.636680201721688,1.47789516217308,TRUE,0.637163393394534,0.637163393394534,0.136542838930173,0.226293767675293
391
+"P62494",1,-0.875226642368928,-0.321562156996831,-0.242564692226915,1.43935349159267,TRUE,0.637716437553985,0.637716437553985,0.146208219544589,0.216075342901426
392
+"P31399",1,-0.470208570391622,-0.0412241154858339,-0.894592914726523,1.40602560060398,TRUE,0.638284392627985,0.638284392627985,0.127343860840576,0.234371746531439
393
+"P47853",2,0.0975859407159747,-0.607614700796025,1.37108263321649,-0.861053873136442,TRUE,0.639076498935771,0.151048511601175,0.639076498935771,0.209874989463054
394
+"Q5BJQ0",2,1.08726159627616,-1.04336610793286,0.581494870801643,-0.625390359144938,TRUE,0.639083377414188,0.136377168100543,0.639083377414188,0.22453945448527
395
+"Q01129",2,1.06209980219484,-1.06407929662946,0.609133357503201,-0.607153863068581,TRUE,0.639366738458162,0.137177572366542,0.639366738458162,0.223455689175296
396
+"P18886",1,-1.03809119653527,0.941345795275714,-0.669803783620534,0.766549184880087,TRUE,0.639615584533843,0.639615584533843,0.122195379909938,0.238189035556219
397
+"P58775",2,0.340197608778361,0.011671454259343,1.01196770464695,-1.36383676768466,TRUE,0.639847071242318,0.136000388320118,0.639847071242318,0.224152540437564
398
+"P31232",2,0.0852877705736374,-0.475230474522176,1.35489685305067,-0.964954149102127,TRUE,0.641068323125084,0.148504944871037,0.641068323125084,0.210426732003878
399
+"O35413",1,-0.781381830599306,0.835071675856656,-0.946262246603309,0.892572401345959,TRUE,0.641515574388034,0.641515574388034,0.114844147823496,0.24364027778847
400
+"Q8K4G6",2,0.977227619618984,-1.10964231740671,0.700617815697088,-0.568203117909363,TRUE,0.642457763010179,0.13858293134204,0.642457763010179,0.218959305647781
401
+"P13635",2,0.283953775325823,-0.922570200750295,1.28479229045635,-0.646175865031879,TRUE,0.643900709229564,0.149720548574296,0.643900709229564,0.20637874219614
402
+"P04166",1,-1.38864635228415,0.381825318512846,0.0456843774702084,0.961136656301095,TRUE,0.644151256089897,0.644151256089897,0.143592733370277,0.212256010539826
403
+"Q8VHF5",1,-0.630732436452763,0.667069504356059,-1.05656505713357,1.02022798923028,TRUE,0.644197931043964,0.644197931043964,0.112712011882262,0.243090057073774
404
+"P01026",2,0.426633978530632,-1.04042852269756,1.18641988870454,-0.572625344537611,TRUE,0.645723479031788,0.147754289816504,0.645723479031788,0.206522231151708
405
+"P47858",2,1.09377304025547,-1.01669877290107,0.580742254098493,-0.657816521452892,TRUE,0.645981018602164,0.133136115994732,0.645981018602164,0.220882865403103
406
+"P48721",1,-0.962941416308281,0.915262859291596,-0.761622720814342,0.809301277831027,TRUE,0.647036064974961,0.647036064974961,0.117415985761126,0.235547949263913
407
+"P62250",2,0.1862367106406,-0.175732438444619,1.20602380847882,-1.2165280806748,TRUE,0.647843394615604,0.139129265777517,0.647843394615604,0.213027339606878
408
+"P11232",1,-1.10827386841977,0.914194174504143,-0.580139811657746,0.774219505573374,TRUE,0.650170289746302,0.650170289746302,0.12125088961537,0.228578820638328
409
+"B0K020",1,-0.737154900693624,-0.282206753622316,-0.45401334358513,1.47337499790107,TRUE,0.650388117418816,0.650388117418816,0.135954746223264,0.21365713635792
410
+"Q07969",1,-1.38245722875248,0.400738690947735,0.0184532631653863,0.963265274639362,TRUE,0.65107660616225,0.65107660616225,0.139976398718858,0.208946995118892
411
+"Q63041",2,0.170731195865037,-0.691886992252908,1.34601365554104,-0.824857859153172,TRUE,0.651270046815841,0.14549880226381,0.651270046815841,0.203231150920349
412
+"P01946",2,0.562191521135483,-1.09254439867149,1.08665387094115,-0.556300993405134,TRUE,0.652023504375867,0.143083997505041,0.652023504375867,0.204892498119092
413
+"P35171",1,-1.38077398054179,0.4633691767383,-0.0198038330037166,0.937208636807204,TRUE,0.654933074823187,0.654933074823187,0.137028189143875,0.208038736032938
414
+"P20759",2,0.162063304269774,-0.596716697311395,1.34053702466903,-0.905883631627405,TRUE,0.65669248301324,0.142009722602982,0.65669248301324,0.201297794383778
415
+"Q9QX79",2,1.00288406721337,-1.05457723129276,0.689455774020256,-0.637762609940871,TRUE,0.657951469227294,0.131059950320329,0.657951469227294,0.210988580452377
416
+"Q7TQ16",1,-0.499977124470033,0.12996983278078,-0.969266257518969,1.33927354920822,TRUE,0.659559928319524,0.659559928319524,0.116096247168607,0.224343824511869
417
+"Q5XIM5",1,-0.908053298894656,-0.24967146778828,-0.27053153200154,1.42825629868448,TRUE,0.66098751160239,0.66098751160239,0.135388283893368,0.203624204504241
418
+"P08649",2,0.339763624111834,-0.898697034072057,1.25944146034262,-0.700508050382392,TRUE,0.662238390621092,0.140361328802502,0.662238390621092,0.197400280576406
419
+"P40307",2,0.946725307607577,-0.150731489062729,0.541201720027968,-1.33719553857282,TRUE,0.663045480527123,0.116147969290933,0.663045480527123,0.220806550181944
420
+"P12075",1,-1.26793202105795,0.0743770286177042,0.0160324197879628,1.17752257265228,TRUE,0.664383945476122,0.664383945476122,0.137166815806672,0.198449238717206
421
+"P62260",1,-1.13114051320034,0.878930425527785,-0.550724876570803,0.80293496424336,TRUE,0.664526522903921,0.664526522903921,0.117305541252761,0.218167935843318
422
+"P15800",1,-0.784297472230128,0.778381404337792,-0.940170367838262,0.946086435730598,TRUE,0.665303844375702,0.665303844375702,0.107985599021303,0.226710556602995
423
+"Q68FP1",2,0.534522985379896,-1.03781470847353,1.12071850802388,-0.617426784930247,TRUE,0.665605279016978,0.137109148062245,0.665605279016978,0.197285572920776
424
+"P21396",1,-0.788588412440127,0.776538914982373,-0.936058855334124,0.948108352791878,TRUE,0.667496190860753,0.667496190860753,0.107406818602001,0.225096990537246
425
+"Q64560",2,1.14214132967965,-0.858480449230577,0.535772966562172,-0.819433847011242,TRUE,0.66962252444466,0.120671112526655,0.66962252444466,0.209706363028685
426
+"P11884",1,-0.934130101211601,-0.21801463435277,-0.265400099792983,1.41754483535735,TRUE,0.670095728569556,0.670095728569556,0.131515709089321,0.198388562341123
427
+"Q6NYB7",2,0.224068341391805,-0.635255378800842,1.315031798246,-0.903844760836961,TRUE,0.67044914425222,0.135502914635177,0.67044914425222,0.194047941112602
428
+"Q9WTT6",2,0.80890406594525,-1.08222417923816,0.890686944696315,-0.617366831403408,TRUE,0.671181916793424,0.130123464979734,0.671181916793424,0.198694618226843
429
+"P60868",1,-1.35936752610052,0.493426954703629,-0.0836162185579383,0.949556789954831,TRUE,0.671874651878832,0.671874651878832,0.128597722719598,0.19952762540157
430
+"Q9WUS0",2,1.15582439339274,-0.489244716590903,0.44212790261472,-1.10870757941655,TRUE,0.671888407626634,0.113781289751675,0.671888407626634,0.214330302621691
431
+"P02466",2,1.12897992566093,-0.86866329718979,0.554292571526405,-0.814609199997548,TRUE,0.672862244710203,0.119902176383186,0.672862244710203,0.20723557890661
432
+"Q4QQV3",1,-0.66920500946155,-0.165917039675088,-0.625492610864666,1.4606146600013,TRUE,0.673054773259958,0.673054773259958,0.122278368147508,0.204666858592534
433
+"P06866",2,0.357087461355177,-0.865334063347174,1.25275441395408,-0.744507811962079,TRUE,0.67320178661755,0.134913092560904,0.67320178661755,0.191885120821546
434
+"Q9Z1Y3",1,-0.846558817209897,0.806062699653354,-0.883295278716713,0.923791396273256,TRUE,0.673293035644301,0.673293035644301,0.106606365337399,0.2201005990183
435
+"Q5XIN6",1,-0.998710018616846,0.8672376187346,-0.722246894865003,0.85371929474725,TRUE,0.673922635872515,0.673922635872515,0.109897854108383,0.216179510019102
436
+"Q6AXV4",1,-1.19076943099747,0.830227067268889,-0.463077782910879,0.82362014663946,TRUE,0.674718807925119,0.674718807925119,0.116228959331112,0.209052232743769
437
+"P47875",2,0.887628485937433,-1.05443716804006,0.820413622334687,-0.653604940232057,TRUE,0.676500162934199,0.126069837311159,0.676500162934199,0.197429999754642
438
+"P38983",1,-1.15720818305547,0.839460259971627,-0.514065048207758,0.831812971291606,TRUE,0.678664024145683,0.678664024145683,0.113542144667094,0.207793831187223
439
+"P14604",1,-1.34906799541284,0.418209969856853,-0.0692987838597552,1.00015680941574,TRUE,0.679569938224786,0.679569938224786,0.126427914404414,0.1940021473708
440
+"Q63081",2,0.580223922754806,-0.0831099267384291,0.876803339177833,-1.37391733519421,TRUE,0.680191205144248,0.116976863544815,0.680191205144248,0.202831931310937
441
+"P51886",2,0.344380836895407,-0.203032373733553,1.11890342464338,-1.26025188780523,TRUE,0.680892903027148,0.123111246117145,0.680892903027148,0.195995850855707
442
+"P29457",2,0.483765543336224,-0.114659136138129,0.974046039380017,-1.34315244657811,TRUE,0.682380840691849,0.118565700707126,0.682380840691849,0.199053458601026
443
+"P62243",2,0.302790675173723,-0.304602976459511,1.187399553815,-1.18558725252922,TRUE,0.685983867704542,0.123249814531846,0.685983867704542,0.190766317763613
444
+"Q811A2",1,-1.24764052788887,0.102871307721149,-0.0511385745272793,1.195907794695,TRUE,0.686603047899073,0.686603047899073,0.126416835584321,0.186980116516606
445
+"O35303",1,-1.3054140144265,0.238038045433344,-0.0449251895122416,1.1123011585054,TRUE,0.68681522244793,0.68681522244793,0.125402822074308,0.187781955477762
446
+"Q05962",1,-0.708480998497477,-0.134760379718754,-0.609002011946463,1.45224339016269,TRUE,0.688496574278572,0.688496574278572,0.116503730783835,0.194999694937592
447
+"P63018",1,-1.33518853352291,0.512504082016222,-0.143728171804577,0.966412623311266,TRUE,0.689434116909049,0.689434116909049,0.120265067402284,0.190300815688666
448
+"O35115",2,0.441607480316347,-0.175471856152593,1.03714122390325,-1.30327684806701,TRUE,0.690773435886909,0.117026794538203,0.690773435886909,0.192199769574888
449
+"O08557",2,0.370248667582816,-0.24542399633617,1.1197239481654,-1.24454861941204,TRUE,0.691814767552156,0.118900870085117,0.691814767552156,0.189284362362727
450
+"Q66HD0",2,0.673597714134831,-0.129521144222161,0.819172220800402,-1.36324879071307,TRUE,0.693158205849928,0.110977640874502,0.693158205849928,0.19586415327557
451
+"Q5XIF6",1,-0.59300662846968,0.0749073486863052,-0.860887544919984,1.37898682470336,TRUE,0.693645161534818,0.693645161534818,0.10735582115886,0.198999017306322
452
+"P29419",1,-0.606514491268633,0.400529539212232,-1.00391794488732,1.20990289694372,TRUE,0.693646140530582,0.693646140530582,0.100978027138181,0.205375832331236
453
+"O88761",1,-1.18781959870219,0.785649276296788,-0.466361215475405,0.868531537880808,TRUE,0.695227908869718,0.695227908869718,0.109143329236449,0.195628761893833
454
+"Q8VIF7",2,0.680844497284992,-0.138035453509965,0.817190020421299,-1.35999906419633,TRUE,0.695370257421684,0.110144973240496,0.695370257421684,0.19448476933782
455
+"P20280",2,1.10868184216276,-0.514436491178559,0.518234884361035,-1.11248023534523,TRUE,0.69542256216386,0.106898669734887,0.69542256216386,0.197678768101253
456
+"P41123",1,-1.2974212707702,0.254523149680236,-0.073571009260818,1.11646913035078,TRUE,0.69631231121403,0.69631231121403,0.120879482228186,0.182808206557783
457
+"P04636",1,-0.587545692388514,0.16668498401202,-0.916167246451181,1.33702795482767,TRUE,0.697352213223813,0.697352213223813,0.103983386851486,0.198664399924701
458
+"P42123",1,-0.685045635814527,-0.0774279367606676,-0.675653562098333,1.43812713467353,TRUE,0.697700945148391,0.697700945148391,0.111183284180359,0.19111577067125
459
+"Q6P6R2",1,-0.597410135732198,0.321110766983129,-0.980290822417484,1.25659019116655,TRUE,0.698164099393385,0.698164099393385,0.100796391618063,0.201039508988552
460
+"P01836",2,0.53098960676532,-0.920346061893419,1.14209944837598,-0.752742993247878,TRUE,0.698204567488552,0.122046980345422,0.698204567488552,0.179748452166026
461
+"P80254",1,-1.20149526553049,0.0621757201132562,-0.102470718137978,1.24179026355521,TRUE,0.698681218846142,0.698681218846142,0.120826639461489,0.180492141692369
462
+"B2GV54",1,-1.23803880474347,0.123656648578671,-0.0874193299247909,1.20180148608959,TRUE,0.699280489844519,0.699280489844519,0.12040103687363,0.180318473281851
463
+"P12346",2,0.492406583688901,-0.881852948783289,1.17043750995543,-0.780991144861046,TRUE,0.700022108061318,0.121486994528127,0.700022108061318,0.178490897410555
464
+"B4F7A1",1,-0.773188375230204,0.67730065186968,-0.936649032779207,1.03253675613973,TRUE,0.700077298545338,0.700077298545338,0.0977936495048518,0.20212905194981
465
+"P63039",1,-0.628353206257789,0.0262462865979627,-0.799677435819485,1.40178435547931,TRUE,0.70066907246915,0.70066907246915,0.106617164321209,0.192713763209641
466
+"P24268",1,-1.27997407702023,0.656657100901126,-0.295056349254152,0.91837332537326,TRUE,0.701558730753728,0.701558730753728,0.111428251476951,0.187013017769322
467
+"P62963",1,-1.28391328785573,0.239481903951613,-0.0896652724132517,1.13409665631737,TRUE,0.702420612216982,0.702420612216982,0.118228122115811,0.179351265667208
468
+"P04937",2,0.753607266463898,-0.986941201935232,0.962480419134432,-0.729146483663098,TRUE,0.704335737945452,0.116527732968063,0.704335737945452,0.179136529086485
469
+"P32551",1,-0.826939415852127,0.7161688214401,-0.892543592377494,1.00331418678952,TRUE,0.705020258298256,0.705020258298256,0.096842943801927,0.198136797899817
470
+"Q5XIC0",1,-0.925292031940247,0.768427646825985,-0.79936345267094,0.956227837785201,TRUE,0.710142151286179,0.710142151286179,0.096788667759846,0.193069180953975
471
+"P56574",1,-0.69779180033383,-0.0361393573241674,-0.691914272275097,1.42584542993309,TRUE,0.710323123090992,0.710323123090992,0.105840057403748,0.18383681950526
472
+"Q6UPE1",1,-0.801987920857487,0.676482923806955,-0.909695566014417,1.03520056306495,TRUE,0.711590326789792,0.711590326789792,0.0946510190616539,0.193758654148555
473
+"P11762",2,0.488807019107611,-0.25298621879045,1.03735146328237,-1.27317226359953,TRUE,0.711699212849316,0.109136834087655,0.711699212849316,0.17916395306303
474
+"P26772",1,-0.62356012123183,0.1530894551725,-0.877658433264579,1.34812909932391,TRUE,0.712095137892149,0.712095137892149,0.0998233730269053,0.188081489080945
475
+"P04906",1,-1.21582740418125,0.125221122690545,-0.129742177385399,1.22034845887611,TRUE,0.712805029172927,0.712805029172927,0.114155040579868,0.173039930247204
476
+"P36201",1,-0.68038849577225,0.0094772643020312,-0.739700358071874,1.41061158954209,TRUE,0.714858614444676,0.714858614444676,0.102861092139895,0.182280293415429
477
+"D3ZAF6",1,-0.795794121431482,0.657100799760661,-0.911803770166623,1.05049709183744,TRUE,0.716447414424288,0.716447414424288,0.093178708748847,0.190373876826865
478
+"P12847",1,-0.685126579506199,0.0107111177813645,-0.735887962564606,1.41030342428944,TRUE,0.716543525271226,0.716543525271226,0.102313615065404,0.181142859663371
479
+"P14046",2,0.793894451710395,-0.944825897768602,0.931516385006709,-0.780584938948503,TRUE,0.718076309414663,0.109862322105147,0.718076309414663,0.17206136848019
480
+"Q9Z1N4",1,-1.23313661054892,0.677449504808424,-0.380199830355978,0.93588693609647,TRUE,0.719664176108275,0.719664176108275,0.102835858616995,0.177499965274729
481
+"Q2PQA9",1,-0.895317258570602,0.731349948043854,-0.82633666833981,0.990303978866558,TRUE,0.719678776335465,0.719678776335465,0.0933292831559274,0.186991940508608
482
+"P70623",2,0.405179407448735,-0.558298613544979,1.19736501886647,-1.04424581277022,TRUE,0.721002595880855,0.110552183043338,0.721002595880855,0.168445221075806
483
+"P07872",1,-1.1985775963355,0.122683699025297,-0.158324053333857,1.23421795064406,TRUE,0.72156155677264,0.72156155677264,0.110159501722126,0.168278941505234
484
+"Q9Z1H9",2,1.05993604832349,-0.653284728971853,0.623436696927137,-1.03008801627877,TRUE,0.722253879437678,0.100102597714371,0.722253879437678,0.177643522847952
485
+"P11240",1,-1.02659124692239,-0.0449593768298388,-0.291865521017455,1.36341614476968,TRUE,0.722941345275335,0.722941345275335,0.108485079652556,0.168573575072109
486
+"P10888",1,-0.675692051961226,0.0706804130712309,-0.782718809037126,1.38773044792712,TRUE,0.723800387907532,0.723800387907532,0.0982946860638892,0.177904926028578
487
+"P13697",1,-1.06056424115228,0.768376592709003,-0.641977901960249,0.934165550403522,TRUE,0.723954317442044,0.723954317442044,0.0954275135212004,0.180618169036756
488
+"Q9Z0W7",1,-0.67845705558116,0.081058873824372,-0.78635463795795,1.38375281971474,TRUE,0.72632879054503,0.72632879054503,0.0972365174778713,0.176434691977099
489
+"Q2PS20",1,-1.24349592392201,0.228326048394248,-0.158110249511984,1.17328012503974,TRUE,0.726701470289982,0.726701470289982,0.107383034611081,0.165915495098937
490
+"Q63797",2,0.515706069951749,-0.319354385828572,1.0447990119352,-1.24115069605838,TRUE,0.726733089851389,0.103714925877688,0.726733089851389,0.169551984270923
491
+"P27321",2,0.454757736352876,-0.412211456008723,1.12379716853757,-1.16634344888172,TRUE,0.727570641210793,0.105466192849563,0.727570641210793,0.166963165939645
492
+"P48037",2,0.692119996706304,-0.265489505468854,0.872842764207288,-1.29947325544474,TRUE,0.728874495309359,0.0992921829231539,0.728874495309359,0.171833321767487
493
+"P62919",1,-1.23244219332935,0.212335398496676,-0.166589411684196,1.18669620651687,TRUE,0.729456957044522,0.729456957044522,0.106254823267734,0.164288219687744
494
+"P18163",1,-0.958611485553349,0.739908154897204,-0.759464877062141,0.978168207718286,TRUE,0.729877512765659,0.729877512765659,0.0912316246807886,0.178890862553552
495
+"Q03344",1,-0.659696754311584,0.19869768463916,-0.869286660601423,1.33028573027385,TRUE,0.730004180865213,0.730004180865213,0.0933778551209901,0.176617964013797
496
+"Q63862",2,0.517652161163523,-0.748898584457472,1.15110611737193,-0.919859694077984,TRUE,0.730908655711776,0.106931376440198,0.730908655711776,0.162159967848026
497
+"Q5XFX0",2,0.559313372540016,-0.316198543774425,1.00929063514242,-1.25240546390801,TRUE,0.731820180684271,0.101015044297396,0.731820180684271,0.167164775018333
498
+"Q9Z0J5",1,-0.738642553359736,0.019681706008068,-0.68827132621593,1.4072321735676,TRUE,0.733849556082577,0.733849556082577,0.096828385342742,0.169322058574681
499
+"P23928",1,-0.667348943380565,0.211324108857495,-0.868803014781052,1.32482784930412,TRUE,0.733874686759173,0.733874686759173,0.0919417394415861,0.174183573799241
500
+"P08503",1,-0.87626686802145,0.68111105824002,-0.83762293110798,1.03277874088941,TRUE,0.73580312055777,0.73580312055777,0.0881231423252667,0.176073737116963
501
+"P35738",2,1.01053313280792,-0.707693603981271,0.694788442906673,-0.99762797173332,TRUE,0.736007180427042,0.0965906226436517,0.736007180427042,0.167402196929306
502
+"P10536",1,-1.24610295450899,0.280305504887791,-0.188768564048309,1.15456601366951,TRUE,0.737069090530911,0.737069090530911,0.102420825242881,0.160510084226208
503
+"Q3KR86",1,-1.01463515897453,0.735023183280667,-0.694209895016512,0.973821870710374,TRUE,0.738965716508355,0.738965716508355,0.0894642418849979,0.171570041606647
504
+"P02454",2,0.905031785827905,-0.829835769027947,0.825380219196657,-0.900576235996614,TRUE,0.740864609861914,0.0978857025087708,0.740864609861914,0.161249687629315
505
+"P41565",1,-1.26476488982974,0.42863404896448,-0.24037411133899,1.07650495220425,TRUE,0.741790253529521,0.741790253529521,0.0987416957935791,0.1594680506769
506
+"O35077",1,-0.817883244179259,-0.0123322096863022,-0.581457891974591,1.41167334584015,TRUE,0.742088235809961,0.742088235809961,0.0958955370892796,0.16201622710076
507
+"Q5U216",2,0.98097889447398,-0.536584435478646,0.686377020249097,-1.13077147924443,TRUE,0.742261149804584,0.0927727395835675,0.742261149804584,0.164966110611849
508
+"P02650",2,0.859635355917474,-0.838417441438135,0.871960628912477,-0.893178543391817,TRUE,0.743922529782408,0.0975162885356497,0.743922529782408,0.158561181681942
509
+"P85125",2,0.952077877626545,-0.490741849132921,0.703758196550649,-1.16509422504427,TRUE,0.744504834605768,0.0918992642889152,0.744504834605768,0.163595901105316
510
+"P05065",1,-1.07735498552758,0.722543094591348,-0.614519547442156,0.969331438378388,TRUE,0.744551303308461,0.744551303308461,0.0891261652693754,0.166322531422164
511
+"Q9EQP5",2,0.565080295586731,-0.720110165324766,1.11436315883433,-0.959333289096297,TRUE,0.74461893699538,0.100414962816462,0.74461893699538,0.154966100188158
512
+"O35264",2,0.569482358705203,-0.707524707040695,1.10959091884696,-0.971548570511472,TRUE,0.747071897423549,0.09924360842738,0.747071897423549,0.153684494149071
513
+"P21913",2,0.916646946907413,-0.459720418639509,0.731751447608624,-1.18867797587653,TRUE,0.748013610125537,0.0908453337693014,0.748013610125537,0.161141056105162
514
+"O70351",1,-1.13823671948862,0.692000516614328,-0.527211519807892,0.973447722682187,TRUE,0.748214405198314,0.748214405198314,0.0896309999806417,0.162154594821045
515
+"P86252",2,0.909273827400644,-0.457347136781224,0.738903442499646,-1.19083013311907,TRUE,0.749149713590448,0.0905243682334099,0.749149713590448,0.160325918176142
516
+"P45592",1,-1.13786951801662,0.115717552643501,-0.253602082848466,1.27575404822158,TRUE,0.749197348980721,0.749197348980721,0.0976832202992906,0.153119430719989
517
+"P15429",2,0.891149985439135,-0.786802945464505,0.83702518561354,-0.941372225588171,TRUE,0.751096161501165,0.0937325592135216,0.751096161501165,0.155171279285313
518
+"Q9R063",1,-0.793046701978257,0.0413002784052446,-0.645598734183537,1.39734515775655,TRUE,0.752714030296647,0.752714030296647,0.0904918571100764,0.156794112593276
519
+"Q03626",2,0.955069258540878,-0.598864822802357,0.734521153346977,-1.0907255890855,TRUE,0.753122408973037,0.0899411871371534,0.753122408973037,0.156936403889809
520
+"P49242",1,-1.24643486859391,0.402571478858155,-0.25934784118729,1.10321123092304,TRUE,0.753154210549828,0.753154210549828,0.0942279109148902,0.152617878535282
521
+"P15999",1,-0.724107601596488,0.156337599403011,-0.78617232181351,1.35394232400699,TRUE,0.75355842274448,0.75355842274448,0.0869774256341243,0.159464151621395
522
+"O55171",1,-0.903023485685869,0.655863268295714,-0.804818477869452,1.05197869525961,TRUE,0.754461956058551,0.754461956058551,0.0826843564356634,0.162853687505786
523
+"P04764",1,-0.745678613374819,0.113171010050326,-0.739947598144616,1.37245520146911,TRUE,0.75505565098606,0.75505565098606,0.0875473647560211,0.157396984257919
524
+"P62907",1,-1.13878165567612,0.674041911984698,-0.522895752587309,0.987635496278727,TRUE,0.755328243965811,0.755328243965811,0.0872836689878272,0.157388087046362
525
+"D3Z9R8",1,-1.00486648641307,0.695434177564073,-0.699315599165439,1.00874790801444,TRUE,0.756666500539046,0.756666500539046,0.0835680192950297,0.159765480165925
526
+"P85834",1,-0.919394786963388,0.0124533169438206,-0.480147689610525,1.38708915963009,TRUE,0.758212730351947,0.758212730351947,0.0913065851606097,0.150480684487443
527
+"P61016",1,-0.870213552556973,0.0187279315425049,-0.543758029133742,1.39524365014821,TRUE,0.758344274684338,0.758344274684338,0.0902110979810269,0.151444627334635
528
+"P24090",2,0.921002879400943,-0.661826300703325,0.786968690429269,-1.04614526912689,TRUE,0.760204445658454,0.0885273535316078,0.760204445658454,0.151268200809938
529
+"P53534",2,0.905235622782682,-0.552303696579053,0.775697001343731,-1.12862892754736,TRUE,0.761305341398894,0.0871923681723309,0.761305341398894,0.151502290428775
530
+"P02767",2,0.83127697537868,-0.468770525776114,0.824611408578162,-1.18711785818073,TRUE,0.762917416702938,0.0868164011214734,0.762917416702938,0.150266182175589
531
+"P34058",1,-0.880469794756418,0.616264641983705,-0.819235599602198,1.08344075237491,TRUE,0.763370308501621,0.763370308501621,0.0797027776977594,0.156926913800619
532
+"P13437",1,-0.957407010055961,0.663914884832136,-0.747546962355251,1.04103908757908,TRUE,0.764200828532279,0.764200828532279,0.0803506024547501,0.155448569012971
533
+"P12001",1,-0.741304427532002,0.367374120806414,-0.872655548572389,1.24658585529798,TRUE,0.764303619902928,0.764303619902928,0.0802197766877447,0.155476603409328
534
+"P16303",2,0.883516348871785,-0.542782776318995,0.795742947469058,-1.13647652002185,TRUE,0.764318116249134,0.086305883255275,0.764318116249134,0.149376000495591
535
+"Q64591",1,-0.759303594569315,0.42239534080674,-0.877558932695935,1.21446718645851,TRUE,0.765704805165598,0.765704805165598,0.0792654806092723,0.155029714225129
536
+"P05545",2,0.634244682656936,-0.563964427654486,1.03191379563016,-1.10219405063261,TRUE,0.766328193472795,0.0893296547394186,0.766328193472795,0.144342151787787
537
+"P19511",1,-0.770556842626532,0.147975799600781,-0.735261373389242,1.35784241641499,TRUE,0.769486220127236,0.769486220127236,0.0822132685175606,0.148300511355204
538
+"P67779",1,-1.0883086799354,0.661645853112395,-0.588787155859945,1.01544998268295,TRUE,0.770215275076777,0.770215275076777,0.0809616163048975,0.148823108618326
539
+"P05544",2,0.854783773442685,-0.63963521802757,0.850827266027975,-1.06597582144309,TRUE,0.770686528175017,0.0853452423958334,0.770686528175017,0.14396822942915
540
+"P57093",1,-0.882642589584684,0.056353645865472,-0.555460095647849,1.38174903936706,TRUE,0.7719193874239,0.7719193874239,0.0847073773044439,0.143373235271656
541
+"P10719",1,-0.786139691023282,0.449812982768322,-0.862150879344056,1.19847758759902,TRUE,0.773637546521946,0.773637546521946,0.0766475886719663,0.149714864806088
542
+"P35434",1,-1.04708951247394,0.124468688111093,-0.393820135095721,1.31644095945856,TRUE,0.784699626682989,0.784699626682989,0.0818129919811762,0.133487381335835
543
+"P04904",1,-0.93347486681692,0.600765691983322,-0.758944704393074,1.09165387922667,TRUE,0.785262761965365,0.785262761965365,0.0733766764924581,0.141360561542177
544
+"Q06647",1,-0.780303928520852,0.282452321514352,-0.796879712332893,1.29473131933939,TRUE,0.786360223430659,0.786360223430659,0.0744132717612805,0.13922650480806
545
+"Q6P0K8",1,-1.09670520689619,0.616617043561968,-0.566733083499606,1.04682124683382,TRUE,0.786800941289815,0.786800941289815,0.0757014003344939,0.137497658375691
546
+"P14668",1,-1.19001824400734,0.38551037015185,-0.343273350932101,1.14778122478759,TRUE,0.787200962854499,0.787200962854499,0.0801010463686971,0.132697990776804
547
+"P97852",1,-1.07780380960765,0.619952385548442,-0.592409793227392,1.0502612172866,TRUE,0.788425415070478,0.788425415070478,0.0747201006118312,0.136854484317691
548
+"P15650",1,-0.795880206848633,0.231616172526001,-0.755589451913106,1.31985348623574,TRUE,0.789899357243131,0.789899357243131,0.0741046497852409,0.135995992971628
549
+"Q68FY0",1,-1.07770605707768,0.168151034020481,-0.38087484271676,1.29042986577396,TRUE,0.791390453720497,0.791390453720497,0.0791938062981166,0.129415739981386
550
+"A1A5Q0",1,-1.15039305531266,0.294449607372259,-0.354196945170504,1.2101403931109,TRUE,0.796399062170653,0.796399062170653,0.0769632839409814,0.126637653888366
551
+"Q920F5",1,-1.17357998389218,0.448620496352072,-0.398659712037238,1.12361919957735,TRUE,0.796853077755599,0.796853077755599,0.0753771265255001,0.127769795718901
552
+"O89049",1,-0.817860182392178,0.385232243289297,-0.805722569409257,1.23835050851214,TRUE,0.798618747799909,0.798618747799909,0.0693960329044289,0.131985219295662
553
+"P00507",1,-0.988825868867648,0.135902190809088,-0.479080704227237,1.3320043822858,TRUE,0.799499767173449,0.799499767173449,0.0749985659347407,0.12550166689181
554
+"Q60587",1,-1.02967075227574,0.589227304659668,-0.644530873782009,1.08497432139808,TRUE,0.803174173934498,0.803174173934498,0.0689411537930144,0.127884672272487
555
+"Q01205",1,-1.1418561185172,0.30732882492016,-0.374410432636578,1.20893772623362,TRUE,0.803188859065339,0.803188859065339,0.0740628710737808,0.122748269860881
556
+"Q9ER34",1,-0.826115827202921,0.273788106989528,-0.746098277815338,1.29842599802873,TRUE,0.804953465027093,0.804953465027093,0.0686747563856166,0.126371778587291
557
+"P35565",1,-0.924063565928439,0.538126552980134,-0.750973401198032,1.13691041414634,TRUE,0.805492848683568,0.805492848683568,0.0669224017374046,0.127584749579028
558
+"P20788",1,-0.867043308597393,0.463158767971533,-0.786024959808923,1.18990950043478,TRUE,0.80662174894755,0.80662174894755,0.066465379202947,0.126912871849503
559
+"P11442",1,-1.14678650384945,0.383625692534224,-0.407882966087002,1.17104377740222,TRUE,0.810254873509388,0.810254873509388,0.0705986104278854,0.119146516062726
560
+"P14408",1,-1.05472822852825,0.209921395148996,-0.439754364387074,1.28456119776633,TRUE,0.812023293600567,0.812023293600567,0.0704102372619084,0.117566469137524
561
+"Q5PPN7",1,-1.1399977600744,0.44750348420923,-0.447595282700421,1.14008955856559,TRUE,0.813111593763169,0.813111593763169,0.0687223491978513,0.11816605703898
562
+"P07483",1,-0.941244361708913,0.175625021524125,-0.563268660790767,1.32888800097556,TRUE,0.813795875402183,0.813795875402183,0.0683999416910733,0.117804182906744
563
+"Q68FR6",1,-1.06320516670404,0.540783469003295,-0.587519319705086,1.10994101740583,TRUE,0.817809796140966,0.817809796140966,0.06478507591903,0.117405127940004
564
+"Q641Z6",1,-1.05037119200368,0.23689913728425,-0.462093865616469,1.2755659203359,TRUE,0.821088692742266,0.821088692742266,0.0666151643181376,0.112296142939596
565
+"P11030",1,-0.87803698546107,0.271649583450281,-0.689631740679857,1.29601914269065,TRUE,0.822549888262535,0.822549888262535,0.0631778157754023,0.114272295962063
566
+"P61983",1,-1.03858003819239,0.5232515943483,-0.612616643880163,1.12794508772425,TRUE,0.82519407641935,0.82519407641935,0.0619331219920068,0.112872801588643
567
+"P48500",1,-0.927532600372658,0.467907896730675,-0.722846569651962,1.18247127329394,TRUE,0.826333971163515,0.826333971163515,0.0604470823798765,0.113218946456609
568
+"Q64428",1,-0.995014709681899,0.512494273654496,-0.66175760058014,1.14427803660754,TRUE,0.82746136060116,0.82746136060116,0.0605838028419079,0.111954836556932
569
+"P23965",1,-1.08508509529279,0.448995249361606,-0.52418083536045,1.16027068129164,TRUE,0.832756450490346,0.832756450490346,0.0606120440223414,0.106631505487312
570
+"Q5XIH7",1,-1.04514420128843,0.489647485054176,-0.592202973285894,1.14769968952015,TRUE,0.833309449148189,0.833309449148189,0.0594462885073254,0.107244262344485
571
+"Q62920",1,-1.08890601213291,0.414426871184063,-0.50391232109862,1.17839146204747,TRUE,0.834151002780807,0.834151002780807,0.0604887586792481,0.105360238539945
572
+"P35435",1,-1.06792226947819,0.326731224779647,-0.489086584808912,1.23027762950746,TRUE,0.835600504533527,0.835600504533527,0.060510981833976,0.103888513632497
573
+"P13803",1,-0.975020115662053,0.452729931055493,-0.662970123758188,1.18526030836475,TRUE,0.839576919720895,0.839576919720895,0.0565812980343712,0.103841782244734
574
+"P48675",1,-0.939820758372308,0.338242965719301,-0.65351208291623,1.25508987556924,TRUE,0.842617255274285,0.842617255274285,0.0561192014083204,0.101263543317395
575
+"Q68FU3",1,-0.980730200900234,0.385564309938494,-0.627727061236256,1.222892952198,TRUE,0.84800625764793,0.84800625764793,0.0542641296906582,0.0977296126614117
0 576
new file mode 100644
... ...
@@ -0,0 +1,575 @@
1
+"","cluster","Mean.of.log.A","Mean.of.log.B","Mean.of.log.C","Mean.of.log.D","isClusterMember","maxMembership","membership.of.cluster.1","membership.of.cluster.2","membership.of.cluster.3"
2
+"Q9WTT7",1,-1.22255561673122,0.776823490992555,0.856334477189782,-0.410602351451118,FALSE,0.342579857494918,0.342579857494918,0.318677575337628,0.338742567167454
3
+"P63102",3,-1.09658973936807,0.830429584823418,0.865356334646909,-0.599196180102253,FALSE,0.344951164779843,0.318684509183786,0.336364326036372,0.344951164779843
4
+"Q7M0E3",1,-0.237751535202779,-1.30795600637204,0.634796914993558,0.910910626581266,FALSE,0.3462101252131,0.3462101252131,0.344284316659544,0.309505558127356
5
+"P62959",3,-1.11147501524251,0.921737797086268,0.764578478326509,-0.57484126017027,FALSE,0.350468145831587,0.326367113751378,0.323164740417035,0.350468145831587
6
+"P02564",1,-1.29124213047911,0.407225819378061,1.06495216321144,-0.180935852110383,FALSE,0.352641875205598,0.352641875205598,0.327584687839944,0.319773436954458
7
+"P05765",3,-1.07423589883272,0.941039458988321,0.756377650063607,-0.623181210219205,FALSE,0.352719630968537,0.320476506114776,0.326803862916686,0.352719630968537
8
+"P70567",3,-1.17907291834308,1.1033623798076,0.479167216325917,-0.403456677790437,FALSE,0.358434254657302,0.358250735730472,0.283315009612226,0.358434254657302
9
+"P18422",3,0.587017403091773,-1.26481732298012,-0.303727981502697,0.981527901391041,FALSE,0.360504126218146,0.324746863701205,0.314749010080649,0.360504126218146
10
+"P11960",2,0.768286653302108,-1.37327190516234,-0.110336827576684,0.715322079436916,FALSE,0.360508158143925,0.285770238078548,0.360508158143925,0.353721603777527
11
+"P62859",3,-1.11086660411474,1.10454447503702,0.52562489384656,-0.519302764768848,FALSE,0.36249771468967,0.341022159872999,0.296480125437331,0.36249771468967
12
+"P15865",2,0.845317841399481,-1.3509015407395,-0.155065561516922,0.660649260856937,FALSE,0.363781174706396,0.278825745277315,0.363781174706396,0.357393080016289
13
+"O35244",3,-0.942600836699279,1.07903247663846,0.616578229663232,-0.753009869602413,FALSE,0.366603509305978,0.307596013898801,0.325800476795221,0.366603509305978
14
+"Q641Y2",3,-0.658721981942087,1.04056760490572,0.648839467451583,-1.03068509041521,FALSE,0.368668424206739,0.269388291217683,0.361943284575578,0.368668424206739
15
+"Q00715",1,-0.975486617619047,-0.704959089890594,1.10433424359156,0.57611146391808,FALSE,0.369002442748302,0.369002442748302,0.335176245254531,0.295821311997167
16
+"Q5M9I5",1,-0.398721199682967,-1.20991980266353,0.600295332589979,1.00834566975651,FALSE,0.372468907223924,0.372468907223924,0.320990924896669,0.306540167879407
17
+"P09456",1,-1.34882690856007,0.633020500223665,0.869646113221733,-0.15383970488533,FALSE,0.372924588835415,0.372924588835415,0.300793383306,0.326282027858585
18
+"Q4V8H8",2,-0.990376331329471,-0.511646859134656,1.31196408053452,0.19005910992961,FALSE,0.372997246797649,0.330147231900045,0.372997246797649,0.296855521302306
19
+"P29410",1,0.283514062509728,-1.12256801478956,-0.389007210246928,1.22806116252676,FALSE,0.376758831831355,0.376758831831355,0.274044992516767,0.349196175651878
20
+"P10111",1,-1.36070277118647,0.662923511492294,0.831368872284789,-0.133589612590614,FALSE,0.378250967938393,0.378250967938393,0.295146947140438,0.32660208492117
21
+"P18421",3,-0.440627912416783,1.08405540743566,0.521989827727627,-1.1654173227465,FALSE,0.378860216676466,0.251830291819334,0.369309491504201,0.378860216676466
22
+"P31044",3,0.518125805339752,-0.885899999569846,-0.785416238181077,1.15319043241117,FALSE,0.379356168416705,0.364635252098672,0.256008579484624,0.379356168416705
23
+"Q66HG9",3,0.528687527373817,-0.899407350936142,-0.774546156980346,1.14526598054267,FALSE,0.379578361073663,0.36236521947665,0.258056419449688,0.379578361073663
24
+"P02262",3,0.577205983689815,-0.966365457057812,-0.715708269372901,1.1048677427409,FALSE,0.379892779473039,0.351642926924126,0.268464293602836,0.379892779473039
25
+"P21670",3,0.806086873086992,-1.15745324851011,-0.513082652636684,0.864449028059801,FALSE,0.38006233258902,0.307236223604584,0.312701443806396,0.38006233258902
26
+"P29147",3,0.95994417584446,-1.19225678544614,-0.445112954347543,0.677425563949227,FALSE,0.380207361589634,0.282232268655194,0.337560369755172,0.380207361589634
27
+"P52481",3,1.07812861879728,-1.17922044752121,-0.419543459353691,0.520635288077625,FALSE,0.380578690751563,0.264507057826301,0.354914251422136,0.380578690751563
28
+"P84817",3,1.27805083523467,-1.07119723048097,-0.417853541909344,0.210999937155639,FALSE,0.382470575561277,0.235437358666609,0.382092065772114,0.382470575561277
29
+"P97584",1,0.273803667752207,-1.08041827100116,-0.442982941768729,1.24959754501768,FALSE,0.382793006778778,0.382793006778778,0.267302788551144,0.349904204670079
30
+"Q04462",1,0.252472592963566,-1.08498771672392,-0.424134765760787,1.25664988952114,FALSE,0.384788259552033,0.384788259552033,0.267145992859628,0.348065747588339
31
+"Q561S0",2,-0.29195595563046,1.03974319256994,0.507611610559439,-1.25539884749892,FALSE,0.38492065255669,0.237915432231191,0.38492065255669,0.377163915212119
32
+"A7VJC2",2,0.042521075344945,-1.4277086802381,0.677304391903939,0.707883212989214,FALSE,0.386025374581896,0.304308006226037,0.386025374581896,0.309666619192067
33
+"P17074",3,-0.813618258900014,1.25221104136928,0.361139230622043,-0.799732013091312,FALSE,0.387488226649984,0.303624326778633,0.308887446571384,0.387488226649984
34
+"Q80W89",1,-1.38860650766364,0.62745796325888,0.821252679826623,-0.0601041354218674,FALSE,0.387982512847644,0.387982512847644,0.289107194667046,0.32291029248531
35
+"Q66HF1",3,-0.662154669272374,1.21595063242532,0.404890207329366,-0.958686170482312,FALSE,0.38891245378482,0.281712590218541,0.32937495599664,0.38891245378482
36
+"P49134",3,-0.967114563069212,1.36650763374215,0.0427791298065462,-0.442172200479485,FALSE,0.389695548097417,0.352676155361557,0.257628296541026,0.389695548097417
37
+"P36953",2,-1.04471145516165,0.0369296695476287,1.34037224682916,-0.332590461215135,FALSE,0.390624605850948,0.302713923593419,0.390624605850948,0.306661470555633
38
+"P11661",3,1.01400127654449,-1.09525294190164,-0.579423152426748,0.660674817783897,FALSE,0.39229185847837,0.281532072613509,0.326176068908121,0.39229185847837
39
+"P11598",1,0.301084560576599,-0.913710960535612,-0.664980992069462,1.27760739202847,FALSE,0.39507478217813,0.39507478217813,0.247259618233478,0.357665599588391
40
+"Q5XIB3",1,-0.974203733132857,1.39661954883484,-0.285918554631725,-0.136497261070257,FALSE,0.396267726626062,0.396267726626062,0.219142034328488,0.38459023904545
41
+"P21533",1,-1.1610071004706,1.27175679625698,0.064133344864941,-0.174883040651325,FALSE,0.397846474662835,0.397846474662835,0.238558878229023,0.363594647108142
42
+"Q9Z327",3,1.4238473495347,-0.822864036512246,-0.540244687119878,-0.0607386259025733,FALSE,0.399148162925789,0.216927353382965,0.383924483691245,0.399148162925789
43
+"P63159",3,1.06262914289487,-1.01249703502632,-0.674840031796486,0.624707923927939,FALSE,0.402194319281871,0.278552770057531,0.319252910660599,0.402194319281871
44
+"Q9Z2L0",3,0.657315623928304,-0.707989738599222,-0.990882103975011,1.04155621864593,FALSE,0.403382391705751,0.348269228348269,0.24834837994598,0.403382391705751
45
+"P26453",1,-0.928217175921058,1.40351004597353,-0.404410893192759,-0.0708819768597153,FALSE,0.403445239576158,0.403445239576158,0.209874650736441,0.386680109687401
46
+"P62246",3,0.484040352017557,0.884437145960691,0.0393324435093142,-1.40780994148756,FALSE,0.404223537589217,0.196202209693983,0.3995742527168,0.404223537589217
47
+"Q5U2X7",3,0.483365463231436,-0.395542825484475,-1.18541193085588,1.09758929310892,FALSE,0.404460441890074,0.37957724814224,0.215962309967686,0.404460441890074
48
+"P50463",1,-0.927625902520372,1.40167652612515,-0.413732844484173,-0.0603177791206025,FALSE,0.40511169353273,0.40511169353273,0.208776186313098,0.386112120154172
49
+"P04642",2,0.20410079310017,0.947278036467618,0.260423790258789,-1.41180261982658,FALSE,0.405697438762905,0.206707715377244,0.405697438762905,0.387594845859851
50
+"P52504",3,0.517196670869277,0.871657068685931,0.0155957366629745,-1.40444947621818,FALSE,0.405846501473723,0.194996481632924,0.399157016893353,0.405846501473723
51
+"Q642A4",1,-0.990567498090708,1.3838391627856,-0.311600831676004,-0.0816708330188833,FALSE,0.406113851600978,0.406113851600978,0.214073415983133,0.379812732415889
52
+"P85968",3,-0.670588273110441,1.37506139632225,-0.805765134932413,0.101292011720603,FALSE,0.406462310033757,0.406332489911884,0.187205200054359,0.406462310033757
53
+"A0JPQ4",3,-0.798153063530559,1.41456579991769,-0.0149718595747129,-0.601440876812416,FALSE,0.406883791992802,0.326277282002274,0.266838926004924,0.406883791992802
54
+"P62755",3,-0.0389407975291494,1.13744489013407,0.192821775989106,-1.29132586859402,FALSE,0.40688494523448,0.229246410853825,0.363868643911696,0.40688494523448
55
+"P05197",3,-0.806680466134843,1.4533670266097,-0.441430446709359,-0.205256113765502,FALSE,0.4078647276156,0.373983795259804,0.218151477124597,0.4078647276156
56
+"Q925F0",3,0.938465018048178,-0.908394733983895,-0.819289550219721,0.789219266155438,FALSE,0.40867027501034,0.30092987085859,0.29039985413107,0.40867027501034
57
+"Q4V8F9",3,-0.735389850308153,1.42648327512408,-0.650130176291942,-0.0409632485239869,FALSE,0.408831437883954,0.390886402450875,0.200282159665171,0.408831437883954
58
+"Q5BK63",2,-0.455949953851938,0.853808422374985,0.797056492788871,-1.19491496131192,FALSE,0.409735789324192,0.240369233489905,0.409735789324192,0.349894977185903
59
+"Q63617",2,0.222054472732967,0.927367280055935,0.27089439680599,-1.42031614959489,FALSE,0.410240048912249,0.204808255636939,0.410240048912249,0.384951695450811
60
+"P11980",3,0.372565811413721,-0.0700343380101918,-1.3367038965113,1.03417242310777,FALSE,0.412561052111612,0.392939780040309,0.194499167848078,0.412561052111612
61
+"A2RRU1",2,1.42513530027703,-0.891863820107753,-0.391893607115268,-0.141377873054013,FALSE,0.412569044901748,0.208328707104769,0.412569044901748,0.379102247993483
62
+"P60901",3,0.999758449581309,0.532449670126365,-0.244975702237386,-1.28723241747029,FALSE,0.412774141128989,0.17834079546924,0.408885063401771,0.412774141128989
63
+"P12368",3,1.29099592677473,0.180253377604296,-0.405056218203893,-1.06619308617513,FALSE,0.413255096211738,0.175183218798661,0.411561684989601,0.413255096211738
64
+"O35567",1,-0.0794176151699813,-1.10234583661795,-0.144048226856943,1.32581167864488,FALSE,0.414023949682373,0.414023949682373,0.263096921729075,0.322879128588552
65
+"P07895",3,0.186338549751249,0.306350378860213,-1.41896038609356,0.9262714574821,FALSE,0.414088165368551,0.411209086992065,0.174702747639384,0.414088165368551
66
+"P63031",3,1.49135080000615,-0.533609962008834,-0.606344815216201,-0.351396022781113,FALSE,0.414244904326261,0.200935913530975,0.384819182142763,0.414244904326261
67
+"P69897",3,1.45289065868013,-0.680451397169984,-0.638967947908986,-0.133471313601158,FALSE,0.414505663579456,0.214107918322732,0.371386418097813,0.414505663579456
68
+"P05503",1,-1.37323640326891,0.955518608862908,0.447565716305493,-0.0298479218994934,FALSE,0.415095964010743,0.415095964010743,0.252644032537994,0.332260003451264
69
+"Q8CG45",3,1.47145046115324,-0.624139144658676,-0.631400254984229,-0.21591106151033,FALSE,0.415104470672632,0.208965359325137,0.375930170002231,0.415104470672632
70
+"P16290",1,0.276918870971871,-0.0851212638009298,-1.29957590901914,1.1077783018482,FALSE,0.416113019202028,0.416113019202028,0.189222106993396,0.394664873804577
71
+"P24473",1,0.152635238138068,0.345977209942306,-1.41821491756349,0.919602469483118,FALSE,0.41622968919465,0.41622968919465,0.172321148632665,0.411449162172685
72
+"P30427",1,-0.0997799682730416,-1.09555903734175,-0.135602849207248,1.33094185482204,FALSE,0.416649475892421,0.416649475892421,0.261859049395382,0.321491474712197
73
+"P19234",2,-0.238156280128961,0.891942444475275,0.656469030080836,-1.31025519442715,FALSE,0.417049816360559,0.225650844019136,0.417049816360559,0.357299339620305
74
+"P28042",3,-0.345496218280398,1.13256573262833,-1.19608943263915,0.409019918291224,FALSE,0.418188955252144,0.414789662581993,0.167021382165863,0.418188955252144
75
+"P97521",1,-1.22745452042076,1.21876589866509,0.0673019890263837,-0.0586133672707044,FALSE,0.41894602687529,0.41894602687529,0.229868459553016,0.351185513571693
76
+"Q63638",3,0.615481757279154,-0.424605848803438,-1.19604580297424,1.00516989449853,FALSE,0.419297638792659,0.354962266758083,0.225740094449258,0.419297638792659
77
+"P04041",2,-0.89616725763667,0.114745832657532,1.359836070356,-0.578414645376864,FALSE,0.420223907445505,0.274837432550741,0.420223907445505,0.304938660003754
78
+"A2VD12",1,0.216387517496557,-0.735341273088526,-0.807714097180547,1.32666785277252,FALSE,0.421130827937645,0.421130827937645,0.225020964452094,0.353848207610261
79
+"P47727",1,0.278093614538014,-0.410099019281359,-1.10569905628898,1.23770446103232,FALSE,0.421325244339461,0.421325244339461,0.204447722158006,0.374227033502533
80
+"P62832",3,0.868105928023184,0.677624501556055,-0.228541849427491,-1.31718858015175,FALSE,0.421532504707521,0.184222313568664,0.394245181723815,0.421532504707521
81
+"Q5XIF3",3,-0.686652950476595,1.46861271027439,-0.209384312977792,-0.572575446820001,FALSE,0.422561549918368,0.323055688079444,0.254382762002188,0.422561549918368
82
+"O88989",3,1.31147261726968,-0.789297075492299,-0.771340675121424,0.249165133344046,FALSE,0.423681902427629,0.243775653595459,0.332542443976912,0.423681902427629
83
+"P09812",2,0.521983767702376,0.793565524030845,0.127225906946887,-1.44277519868011,FALSE,0.423853223010309,0.189478581374784,0.423853223010309,0.386668195614907
84
+"P36972",2,1.3113962630322,0.117479672727169,-0.36401312008419,-1.06486281567518,FALSE,0.424641740638955,0.172832129054505,0.424641740638955,0.402526130306541
85
+"Q63377",2,0.694862044662732,0.705903448302105,0.0199626836487842,-1.42072817661362,FALSE,0.425853164043424,0.183117587459752,0.425853164043424,0.391029248496824
86
+"P19945",1,-0.828327352557475,-0.880047244076799,0.654038898391862,1.05433569824241,FALSE,0.425924774238905,0.425924774238905,0.282128960371352,0.291946265389743
87
+"Q920L2",2,0.849139095726594,-1.44475511332672,0.213350213381282,0.382265804218844,FALSE,0.426018828315459,0.246319735914521,0.426018828315459,0.32766143577002
88
+"P07632",2,0.856061508446359,0.604419080876901,-0.0839684894072711,-1.37651209991599,FALSE,0.426057108213463,0.178370353928491,0.426057108213463,0.395572537858045
89
+"P35281",3,1.23436122770519,0.297701702767411,-0.438833020677535,-1.09322990979507,FALSE,0.426229354802754,0.177960711678687,0.395809933518559,0.426229354802754
90
+"P0C1X8",3,1.26156448337688,0.258704159268722,-0.455241849003986,-1.06502679364161,FALSE,0.426364652450791,0.178041039040569,0.39559430850864,0.426364652450791
91
+"Q6AXS5",2,-0.0734213683397524,0.875268942905072,0.57555811573419,-1.37740569029951,FALSE,0.426471743204328,0.214497242121711,0.426471743204328,0.359031014673961
92
+"Q505J9",1,0.219255643045472,-0.0307072213378385,-1.30530863973811,1.11676021803047,FALSE,0.427897867851711,0.427897867851711,0.183774735488621,0.388327396659668
93
+"P11951",1,-1.3338251265102,1.07618450897424,0.250368839470242,0.00727177806572177,FALSE,0.428291532103779,0.428291532103779,0.235820799041211,0.33588766885501
94
+"P50503",2,0.395563731917972,0.818380032248664,0.240658262947011,-1.45460202711365,FALSE,0.429541654980176,0.192969647285026,0.429541654980176,0.377488697734798
95
+"P63255",2,-0.507323103447376,0.693138730723931,0.966553899924051,-1.15236952720061,FALSE,0.42962152052399,0.237621245734245,0.42962152052399,0.332757233741765
96
+"P31211",2,-0.827431958207961,-0.314874259283705,1.45539821280822,-0.313091995316558,FALSE,0.432264602058622,0.276033506277119,0.432264602058622,0.291701891664258
97
+"O08730",3,1.31416497032711,0.188825682305777,-0.519304842536431,-0.983685810096455,FALSE,0.432371734526029,0.179981564703754,0.387646700770216,0.432371734526029
98
+"P17764",1,-0.135198790129031,0.794532316434377,-1.36240083730583,0.703067311000481,FALSE,0.433217379476734,0.433217379476734,0.160082752987663,0.406699867535603
99
+"O35763",2,0.931859432282319,0.526071491956477,-0.0996382444133528,-1.35829267982544,FALSE,0.434169503655767,0.174852535238765,0.434169503655767,0.390977961105468
100
+"O35094",3,-0.559064156125634,1.47833051977834,-0.260308296330563,-0.658958067322138,FALSE,0.434698520703205,0.306745380250616,0.258556099046178,0.434698520703205
101
+"Q6P6V0",3,-0.519741286507428,1.40312411993121,-0.872347360577147,-0.0110354728466381,FALSE,0.434842116965727,0.371804198178624,0.193353684855649,0.434842116965727
102
+"Q64536",1,-1.24867078177144,1.19984543131461,0.0247748078984623,0.0240505425583701,FALSE,0.434858187238654,0.434858187238654,0.221150986164126,0.34399082659722
103
+"Q8VBU2",3,1.28786954342104,-0.705845774941151,-0.871441874673088,0.289418106193196,FALSE,0.435109822095708,0.248562077582051,0.316328100322242,0.435109822095708
104
+"P84100",3,1.09399813885662,0.49619439153139,-0.412602437701228,-1.17759009268678,FALSE,0.435403120326958,0.18132822414103,0.383268655532011,0.435403120326958
105
+"P20070",2,-0.191187100684764,-1.26027754640786,1.12683903482903,0.324625612263595,FALSE,0.437141366824468,0.274335402925087,0.437141366824468,0.288523230250446
106
+"P04692",3,0.524222962694514,-0.0673417395369392,-1.3721812179802,0.915299994822626,FALSE,0.437178824247417,0.359541926699753,0.20327924905283,0.437178824247417
107
+"P29266",3,0.750866432895612,0.820549850273136,-0.271790358440313,-1.29962592472843,FALSE,0.43767270102589,0.192133571915402,0.370193727058709,0.43767270102589
108
+"Q63362",3,0.724123291047497,0.841146682965716,-0.261538704480694,-1.30373126953252,FALSE,0.437704675289474,0.193240676590148,0.369054648120378,0.437704675289474
109
+"P68136",1,-0.723198133334644,1.31414364868263,-0.831850716539498,0.240905201191517,FALSE,0.438183049206417,0.438183049206417,0.17686169463113,0.384955256162453
110
+"Q5BK81",1,-0.254565008206742,0.937158477241225,-1.29627414868664,0.613680679652157,FALSE,0.438274872322335,0.438274872322335,0.159241471544955,0.40248365613271
111
+"P26284",3,-0.552048731231546,1.4596723736184,-0.730134478544469,-0.177489163842383,FALSE,0.438836821539342,0.354097516462662,0.207065661997995,0.438836821539342
112
+"P02770",2,-0.676270590076743,-0.684859536878106,1.43795792471005,-0.0768277977552051,FALSE,0.439013272389343,0.275702504262275,0.439013272389343,0.285284223348382
113
+"Q9NQR8",3,-0.10744274387748,0.959313640238656,-1.34933443681078,0.497463540449608,FALSE,0.440343945079666,0.392068957879198,0.167587097041135,0.440343945079666
114
+"P84245",2,-0.406534605662114,-1.06526978216782,1.29125155584021,0.180552831989725,FALSE,0.440543562241963,0.274805998706161,0.440543562241963,0.284650439051877
115
+"Q9R1Z0",3,0.788607483780401,-0.403282914781419,-1.22736601393943,0.842041444940444,FALSE,0.440553524488224,0.323582651059149,0.235863824452628,0.440553524488224
116
+"P03889",3,0.719762247170447,0.855381381699331,-0.282732100463333,-1.29241152840645,FALSE,0.441418690629918,0.19422726694766,0.364354042422423,0.441418690629918
117
+"P07633",1,-0.123189043717616,-0.958574743351368,-0.319598343138577,1.40136213020756,FALSE,0.442865170746551,0.442865170746551,0.238742506004729,0.318392323248721
118
+"P62909",3,-0.503572307087162,1.49330088180059,-0.379352205420729,-0.610376369292696,FALSE,0.443711057104193,0.307064743928193,0.249224198967614,0.443711057104193
119
+"P47942",2,0.0244119384073626,-1.37315030453493,0.9939898240482,0.354748542079372,FALSE,0.443836383935123,0.265474267568746,0.443836383935123,0.290689348496131
120
+"P70615",2,-0.640979130536403,0.432830626234847,1.19497766292747,-0.986829158625919,FALSE,0.443874248950623,0.242864281898272,0.443874248950623,0.313261469151104
121
+"Q5XI32",3,0.651412122615601,0.920285644805855,-0.289049305200988,-1.28264846222047,FALSE,0.446296001089386,0.19829259998276,0.355411398927854,0.446296001089386
122
+"P51650",1,-1.4585861305481,0.762822450486972,0.50374212932785,0.192021550733279,FALSE,0.446472046024767,0.446472046024767,0.241561905759771,0.311966048215462
123
+"Q5XIE6",3,-0.0131078844840037,0.86943634098686,-1.39699326880179,0.540664812298929,FALSE,0.446945152299889,0.384297070087515,0.168757777612596,0.446945152299889
124
+"Q09073",3,-0.354854418232648,1.30594113195523,-1.07400519073979,0.122918477017206,FALSE,0.446987535189207,0.370177808606475,0.182834656204318,0.446987535189207
125
+"Q63159",2,-0.130838896665075,-1.27672199487876,1.12936727546149,0.278193616082341,FALSE,0.447913072905964,0.265963062015719,0.447913072905964,0.286123865078317
126
+"P28023",2,1.38354195947944,-1.00752242593757,-0.190735825292979,-0.185283708248888,FALSE,0.447932142009039,0.200322841239994,0.447932142009039,0.351745016750966
127
+"O35987",3,1.23078203578623,-0.590533116303904,-1.00257844334928,0.362329523866952,FALSE,0.448961145597901,0.256938497492536,0.294100356909563,0.448961145597901
128
+"B2RYW9",3,1.46113771367313,-0.228345988802215,-0.779256190055297,-0.453535534815621,FALSE,0.4499085294137,0.200042027225542,0.350049443360758,0.4499085294137
129
+"P62961",2,-0.0420608702286597,0.769181843032893,0.671388237206508,-1.39850921001074,FALSE,0.450342722364528,0.20643453318863,0.450342722364528,0.343222744446842
130
+"B1PRL5",1,-0.598624199641864,1.2168847923014,-1.00544825159549,0.387187658935953,FALSE,0.450695888355538,0.450695888355538,0.165762070832802,0.38354204081166
131
+"Q9Z270",3,1.30913657253346,-0.557502829597966,-0.964406451602326,0.212772708666834,FALSE,0.450759490455421,0.243587682989361,0.305652826555218,0.450759490455421
132
+"P63324",2,0.778820786981544,0.585460238589606,0.0662053739637651,-1.43048639953492,FALSE,0.451021002782918,0.175172863342712,0.451021002782918,0.37380613387437
133
+"Q68FQ0",3,1.44245405902461,-0.10230459762413,-0.743762475483122,-0.596386985917363,FALSE,0.451165245269741,0.193835715518653,0.354999039211607,0.451165245269741
134
+"Q5I0G4",3,-0.462478175903775,1.45957722939435,-0.780192019109558,-0.216907034381021,FALSE,0.451293438706588,0.340599092651828,0.208107468641584,0.451293438706588
135
+"Q9QZ76",1,0.136490781795837,-0.389930970855571,-1.05590582682842,1.30934601588815,FALSE,0.452279049167695,0.452279049167695,0.194583499969323,0.353137450862982
136
+"P43278",1,-0.963887213220377,-0.728990950287461,0.615597798240325,1.07728036526751,FALSE,0.452521211803768,0.452521211803768,0.262879289053984,0.284599499142247
137
+"P97700",3,-0.426712462367446,1.42728412175252,-0.874588305954145,-0.12598335343093,FALSE,0.45274287092135,0.347015680118003,0.200241448960647,0.45274287092135
138
+"P85972",3,-0.131208127839539,1.38375864101433,-0.249741687977783,-1.00280882519701,FALSE,0.453526293443374,0.255093611011531,0.291380095545095,0.453526293443374
139
+"P22062",3,1.14657519362804,-0.53258482332431,-1.08584903662484,0.471858666321115,FALSE,0.453722340486739,0.269042305004233,0.277235354509028,0.453722340486739
140
+"Q63355",3,1.39227254303094,-0.458228086993823,-0.922754969482947,-0.0112894865541733,FALSE,0.454438300098687,0.226631348278747,0.318930351622567,0.454438300098687
141
+"Q99J82",3,1.09036734729641,0.544325182035761,-0.518432137010402,-1.11626039232177,FALSE,0.454497507710512,0.185340732263718,0.36016176002577,0.454497507710512
142
+"P04897",2,0.543085071588938,0.686756616838447,0.24448844854177,-1.47433013696915,FALSE,0.454817410100966,0.181619962780891,0.454817410100966,0.363562627118143
143
+"P62902",2,0.401115764156966,0.729811617110601,0.347493804659624,-1.47842118592719,FALSE,0.454838781515585,0.186666951084905,0.454838781515585,0.358494267399511
144
+"P0C219",1,-1.13701153338653,1.27059721987052,-0.271566999309857,0.137981312825867,FALSE,0.455717316250607,0.455717316250607,0.19837993087373,0.345902752875663
145
+"Q9JK11",3,1.2227388271462,-0.511854447958883,-1.05908857962475,0.348204200437434,FALSE,0.457172541340216,0.256597590271415,0.286229868388369,0.457172541340216
146
+"P08050",1,-0.978378067259696,1.31207002382211,-0.531245106405444,0.197553149843033,FALSE,0.45749973755124,0.45749973755124,0.18528968262207,0.357210579826689
147
+"P97576",3,-0.41524343848193,1.45575237198778,-0.809242786496914,-0.231266147008938,FALSE,0.457516972170276,0.334312558403851,0.208170469425873,0.457516972170276
148
+"O35854",2,0.56501459940382,-1.48672793406183,0.611887817919841,0.30982551673817,FALSE,0.457718343115642,0.241392562837437,0.457718343115642,0.30088909404692
149
+"P51868",2,-0.723653157350259,-0.0748389075157923,1.43653347016468,-0.638041405298633,FALSE,0.458203227949284,0.250878223076495,0.458203227949284,0.290918548974221
150
+"P41350",2,0.912081265139484,0.475559919216882,0.00588523913774426,-1.39352642349411,FALSE,0.458511847281395,0.170163120093894,0.458511847281395,0.371325032624711
151
+"P14942",2,0.336376881504514,-1.46055795663105,0.808798364835442,0.31538271029109,FALSE,0.458702544117433,0.248174826816495,0.458702544117433,0.293122629066072
152
+"Q3T1J1",2,0.133852908035827,-1.39670067734223,0.973416847081542,0.289430922224862,FALSE,0.458953760198081,0.253359234327024,0.458953760198081,0.287687005474895
153
+"Q71LX6",3,1.38185932450224,-0.421500227695758,-0.955394009425395,-0.00496508738108957,FALSE,0.459389950535618,0.227514288614837,0.313095760849544,0.459389950535618
154
+"Q6P502",3,-0.199521122275059,1.19863077330491,-1.21522428261858,0.216114631588723,FALSE,0.459468260091223,0.362683382713988,0.177848357194789,0.459468260091223
155
+"Q6AY30",3,0.202489343231166,0.638563536443384,-1.46875105856131,0.627698178886762,FALSE,0.459470855205683,0.36556661065479,0.174962534139527,0.459470855205683
156
+"P18420",2,-0.49823678514149,0.469226792514345,1.1394862257753,-1.11047623314816,FALSE,0.459855678196317,0.228380184294733,0.459855678196317,0.31176413750895
157
+"P01048",2,-0.234854167949298,-1.16404835271534,1.25233950454475,0.146563016119883,FALSE,0.459958549707885,0.259466665920508,0.459958549707885,0.280574784371607
158
+"P00564",1,0.0697923341499883,-0.5303866931005,-0.911575274901173,1.37216963385168,FALSE,0.460724655290196,0.460724655290196,0.200075696748839,0.339199647960965
159
+"Q9ER30",3,0.82354919357449,0.822758894481269,-0.442582521895795,-1.20372556615996,FALSE,0.460839810274352,0.194043090497527,0.345117099228121,0.460839810274352
160
+"P16617",3,1.44150893865508,-0.227663629122814,-0.865293545169259,-0.348551764363002,FALSE,0.46088168512738,0.206453098156188,0.332665216716433,0.46088168512738
161
+"Q63416",2,-0.28212840642109,-1.1120391858465,1.29370795495053,0.100459637317061,FALSE,0.46240824363249,0.258332833978428,0.46240824363249,0.279258922389081
162
+"P09605",1,-0.323820337210932,-0.93316928265902,-0.157101787206282,1.41409140707623,FALSE,0.462460286170736,0.462460286170736,0.234441162741021,0.303098551088243
163
+"P62278",3,1.2816891397975,0.29733937581988,-0.684165508538103,-0.894863007079282,FALSE,0.464307888489641,0.18701805441109,0.348674057099269,0.464307888489641
164
+"P02091",2,0.338914789154833,-1.45270270342468,0.834859658407572,0.278928255862271,FALSE,0.465475220396527,0.244132456884996,0.465475220396527,0.290392322718477
165
+"P00388",3,0.514969083728862,0.229720745753188,-1.4688743832705,0.724184553788447,FALSE,0.466572494849649,0.339295698129105,0.194131807021246,0.466572494849649
166
+"Q62871",3,0.962484821604179,-0.297392334120914,-1.27169659361495,0.606604106131684,FALSE,0.466616036121845,0.290357705859989,0.243026258018166,0.466616036121845
167
+"P09650",2,0.155209512015489,-1.39151144105516,0.989220154105079,0.247081774934592,FALSE,0.467005496988912,0.247927984190641,0.467005496988912,0.285066518820446
168
+"P29975",2,1.10918964351926,0.277930085793798,-0.0892409793006588,-1.2978787500124,FALSE,0.467154849844842,0.164799750297291,0.467154849844842,0.368045399857867
169
+"P82995",2,0.227873108522762,0.709255224846857,0.532916266433469,-1.47004459980309,FALSE,0.467483656179701,0.190110117265501,0.467483656179701,0.342406226554798
170
+"P62425",3,-0.191363535544085,1.24601246613443,-1.18104105071426,0.126392120123924,FALSE,0.467968214346954,0.349714803854189,0.182316981798857,0.467968214346954
171
+"B2GV06",1,-1.18192824376596,-0.462874308116883,0.688041155121545,0.956761396761301,FALSE,0.46818173174834,0.46818173174834,0.252828487134705,0.278989781116955
172
+"Q8CFN2",3,1.31692765310314,0.236327759687733,-0.734499581519243,-0.818755831271628,FALSE,0.468206970393879,0.189003778215841,0.34278925139028,0.468206970393879
173
+"P24368",1,-1.4430022988271,0.864617951322675,0.327375528183355,0.251008819321069,FALSE,0.468435105999524,0.468435105999524,0.222869554553971,0.308695339446504
174
+"P27605",1,-1.00863580265014,1.28602590868172,-0.51969278552188,0.242302679490303,FALSE,0.47003941914451,0.47003941914451,0.181785113817153,0.348175467038336
175
+"P18292",2,0.21592647509952,0.699674793030934,0.553304726480143,-1.4689059946106,FALSE,0.470054161071871,0.189905519682858,0.470054161071871,0.340040319245271
176
+"P01835",3,0.7931401985088,-0.098169091674018,-1.37699976781216,0.682028660977373,FALSE,0.470069677402192,0.309065622350686,0.220864700247122,0.470069677402192
177
+"Q4FZT0",3,-0.101062880755208,1.14380902298892,-1.27563676986251,0.2328906276288,FALSE,0.470437095830195,0.351862213307249,0.177700690862556,0.470437095830195
178
+"P49432",1,-0.94148888357518,1.286659476516,-0.618979015333235,0.273808422392411,FALSE,0.470866467524001,0.470866467524001,0.176996872615971,0.352136659860029
179
+"Q5RKI1",3,0.970571046673791,-0.255144250833634,-1.28964030077299,0.57421350493283,FALSE,0.47146158258519,0.287086966928572,0.241451450486238,0.47146158258519
180
+"P97519",3,0.530300241364083,0.253968638566871,-1.47535711943162,0.691088239500664,FALSE,0.471788237128725,0.333768638689436,0.194443124181839,0.471788237128725
181
+"Q64119",2,-0.554223089772288,-0.665148226006098,1.47772407908167,-0.25835276330328,FALSE,0.472070229180447,0.251150720771737,0.472070229180447,0.276779050047816
182
+"Q497B0",1,-1.49634960166187,0.546496270632869,0.549656246529284,0.400197084499716,FALSE,0.473103242084884,0.473103242084884,0.232661421994832,0.294235335920284
183
+"P61589",2,0.712226854361772,0.554183540177929,0.198574782058425,-1.46498517659813,FALSE,0.47402169914195,0.171790231257012,0.47402169914195,0.354188069601038
184
+"Q6AYH5",2,1.26295495769411,0.0660884198564188,-0.155896607850569,-1.17314676969996,FALSE,0.474330771575613,0.162442384626774,0.474330771575613,0.363226843797613
185
+"P62804",1,-0.504603414100624,-0.897247365161814,0.00892475504739636,1.39292602421504,FALSE,0.474697137341413,0.474697137341413,0.233376977347737,0.291925885310851
186
+"P05708",3,0.663934423173226,0.102686383812382,-1.44509966164471,0.6784788546591,FALSE,0.474861515758589,0.319437872403644,0.205700611837767,0.474861515758589
187
+"P47967",2,-0.262263297400804,-1.08312695573393,1.32577111524864,0.0196191378860915,FALSE,0.475307750821236,0.249490752414415,0.475307750821236,0.275201496764348
188
+"P02563",1,-0.0268127992003775,-0.583794186585127,-0.806461989563737,1.41706897534924,FALSE,0.47585006240462,0.47585006240462,0.199072408519942,0.325077529075438
189
+"P24329",3,1.3958620723858,0.00698201191704674,-0.885180802422439,-0.517663281880403,FALSE,0.47610411586392,0.199803180265659,0.324092703870421,0.47610411586392
190
+"Q68FR9",3,0.90059753273327,0.785676656182459,-0.569389075412065,-1.11688511350366,FALSE,0.476202220855468,0.194261873000368,0.329535906144163,0.476202220855468
191
+"P16086",3,0.619749276032991,1.02406388373118,-0.493164169485221,-1.15064899027895,FALSE,0.477538177463991,0.206250804056115,0.316211018479894,0.477538177463991
192
+"P63088",3,0.934382364507242,0.756314980122834,-0.594661125585992,-1.09603621904408,FALSE,0.478112744953864,0.193569357377706,0.32831789766843,0.478112744953864
193
+"P52296",3,1.06900658844428,-0.249744808240528,-1.26381398299482,0.444552202791067,FALSE,0.47872722501056,0.270933237443124,0.250339537546316,0.47872722501056
194
+"P06685",3,1.23837068282774,-0.29885241435084,-1.15378325587032,0.214264987393416,FALSE,0.478750477858487,0.246674628814436,0.274574893327077,0.478750477858487
195
+"Q07803",3,0.581068542455019,0.245833264796872,-1.47647537546803,0.64957356821614,FALSE,0.478761578401618,0.323883704021879,0.197354717576503,0.478761578401618
196
+"Q9EP80",1,-1.47768015573614,0.254113142835235,0.652586389022513,0.570980623878396,FALSE,0.479400067510453,0.479400067510453,0.236574729266296,0.284025203223251
197
+"P80299",1,-0.402198266828379,0.94945407749547,-1.21888687718545,0.671631066518356,FALSE,0.479754040725279,0.479754040725279,0.151606867885372,0.368639091389348
198
+"Q9EQS0",2,0.96281907097593,0.373201605640607,0.0535242672162572,-1.38954494383279,FALSE,0.481459845290068,0.163987621809121,0.481459845290068,0.354552532900811
199
+"Q9WU82",3,0.997586224122385,0.697510786382722,-0.645529334368543,-1.04956767613656,FALSE,0.48201016238869,0.192601978033922,0.325387859577388,0.48201016238869
200
+"Q499N5",2,0.93442879400088,0.393438371070514,0.0744543483902053,-1.4023215134616,FALSE,0.482071112339765,0.164416490781162,0.482071112339765,0.353512396879073
201
+"B2RZ37",1,-0.768871365806504,1.22016864286676,-0.865254255166871,0.413956978106619,FALSE,0.482662339636931,0.482662339636931,0.162859865863005,0.354477794500063
202
+"P27791",2,1.31266645071091,-0.0488858080404664,-0.144065449810621,-1.11971519285982,FALSE,0.485893573765579,0.160340595359804,0.485893573765579,0.353765830874617
203
+"P35745",3,0.245427297553332,0.772124161305991,-1.46425577512131,0.446704316261984,FALSE,0.486037563228379,0.335497617022923,0.178464819748698,0.486037563228379
204
+"Q5XI78",1,-1.33718615888379,1.06819085482938,0.00273605415657945,0.266259249897831,FALSE,0.486119304917924,0.486119304917924,0.200182438408733,0.313698256673343
205
+"Q62812",1,-0.573863282897392,-0.849657553892745,0.0278170043367933,1.39570383245334,FALSE,0.486226739524569,0.486226739524569,0.227538829111324,0.286234431364107
206
+"Q4V8C3",1,-0.237881180454806,-0.764413941803177,-0.462383993494748,1.46467911575273,FALSE,0.486929284903801,0.486929284903801,0.209736677376104,0.303334037720095
207
+"Q64057",2,1.01103552060703,0.317593365785639,0.0407792637679587,-1.36940815016063,FALSE,0.487104617293888,0.161826608175495,0.487104617293888,0.351068774530617
208
+"Q9Z0V6",3,0.156915544469417,0.910384966932221,-1.42162872758755,0.354328216185911,FALSE,0.487814813168091,0.334529314526216,0.177655872305693,0.487814813168091
209
+"P0C546",3,-0.0795023719852119,1.43858518905403,-0.696847113623465,-0.66223570344535,FALSE,0.489005289447312,0.270755901225727,0.240238809326961,0.489005289447312
210
+"P39069",3,1.36375565813091,-0.0142224239084874,-1.01340230072908,-0.336130933493338,FALSE,0.489814665621558,0.209560618136611,0.300624716241832,0.489814665621558
211
+"P08461",3,-0.100312481450952,1.30220859596137,-1.13569708419768,-0.0661990303127416,FALSE,0.490307601376617,0.317286793913243,0.19240560471014,0.490307601376617
212
+"P04797",1,-0.0350871227090812,-0.394646204325311,-0.957883928264705,1.3876172552991,FALSE,0.490974965672898,0.490974965672898,0.184055387894034,0.324969646433069
213
+"Q641Z4",3,0.293785731801982,1.26947900729869,-0.58136420987469,-0.981900529225986,FALSE,0.492229467008837,0.230297661785889,0.277472871205274,0.492229467008837
214
+"Q5M7W5",3,-0.119111695683569,1.43152243122662,-0.850299370077205,-0.46211136546585,FALSE,0.492382824645213,0.286522319294905,0.221094856059882,0.492382824645213
215
+"Q75Q39",3,0.65187587361257,0.275583114885024,-1.48083856030799,0.553379571810401,FALSE,0.492472525665675,0.306869292899299,0.200658181435026,0.492472525665675
216
+"P38650",3,0.616508841843383,0.325109178337739,-1.48837930793847,0.546761287757353,FALSE,0.493147480547931,0.309111423910025,0.197741095542044,0.493147480547931
217
+"P62632",3,0.404357095902588,0.605880660403707,-1.49484454777292,0.484606791466622,FALSE,0.493279238266649,0.322216634043464,0.184504127689886,0.493279238266649
218
+"P21807",2,1.00755050479956,-1.36243020192858,0.358625009979302,-0.00374531285027488,FALSE,0.494973325397902,0.204646716491779,0.494973325397902,0.300379958110319
219
+"P14669",3,0.813613811530261,0.898666695863747,-0.676587382052196,-1.03569312534181,FALSE,0.49611261719173,0.201068744917633,0.302818637890637,0.49611261719173
220
+"Q9EPX0",3,0.733756168975377,0.968231710595509,-0.656381674004518,-1.04560620556637,FALSE,0.496227237847624,0.204438235450269,0.299334526702108,0.496227237847624
221
+"Q63258",3,-0.022590897976474,1.41878602133826,-0.775089333105415,-0.621105790256365,FALSE,0.496913627268259,0.268579746340323,0.234506626391418,0.496913627268259
222
+"Q02874",2,-0.533725672832341,-0.103696713637454,1.43702024004486,-0.799597853575069,FALSE,0.496917086658617,0.224502380483577,0.496917086658617,0.278580532857806
223
+"P52944",1,-1.44365824616963,0.102084773359653,0.618251625094375,0.7233218477156,FALSE,0.497066733428024,0.497066733428024,0.228287345350615,0.27464592122136
224
+"Q63716",1,-1.03152423066447,1.23056444746227,-0.547772491684534,0.348732274886734,FALSE,0.497840670060227,0.497840670060227,0.171612306462318,0.330547023477455
225
+"Q63569",2,1.08833269661863,-1.31313750315304,0.293969524138996,-0.0691647176045851,FALSE,0.498776608455141,0.199005571955122,0.498776608455141,0.302217819589738
226
+"P20760",2,-0.425005494225083,0.192563413252777,1.28994907569098,-1.05750699471867,FALSE,0.499612752925342,0.213182905295022,0.499612752925342,0.287204341779636
227
+"Q5XIJ4",3,-0.0599735127030101,1.36722739659608,-1.0228396619972,-0.284414221895869,TRUE,0.500123137286483,0.293930207081124,0.205946655632393,0.500123137286483
228
+"P07943",1,-0.125686974479761,0.357383505041906,-1.30530994470434,1.07361341414219,TRUE,0.500393658136342,0.500393658136342,0.152897485460495,0.346708856403163
229
+"Q6P9T8",1,-0.0705650788581804,-0.369115111915813,-0.95534398992083,1.39502418069482,TRUE,0.500668709060475,0.500668709060475,0.180053894940383,0.319277395999142
230
+"P60711",1,-1.4128422908071,0.00773150552204512,0.611317446405478,0.793793338879579,TRUE,0.501334776489331,0.501334776489331,0.227029856281187,0.271635367229482
231
+"Q9WUH4",3,-0.0336824751812279,1.34252933362082,-1.06669787046599,-0.242148987973597,TRUE,0.502585160947515,0.294670977395936,0.20274386165655,0.502585160947515
232
+"P40329",3,0.833153665601106,0.17506641758682,-1.44404430814057,0.435824224952646,TRUE,0.503566694472764,0.282085106272079,0.214348199255157,0.503566694472764
233
+"P25113",1,-0.141336993026551,0.370009394473594,-1.30113259623787,1.07246019479083,TRUE,0.504288051919569,0.504288051919569,0.151661808023525,0.344050140056906
234
+"P16036",3,0.283966300393445,0.864276513238112,-1.44393703940052,0.295694225768959,TRUE,0.504949906770347,0.312944907383087,0.182105185846566,0.504949906770347
235
+"Q63799",2,1.33413545605744,-0.154109626414114,-0.0899617531270758,-1.09006407651625,TRUE,0.505820169495065,0.156401959030677,0.505820169495065,0.337777871474258
236
+"Q9JLZ1",3,0.702725020507606,0.339677523977319,-1.48231916118297,0.439916616698041,TRUE,0.506595874716444,0.290955003536289,0.202449121747267,0.506595874716444
237
+"Q5SGE0",3,0.634521771705035,1.06257116815456,-0.729671723708569,-0.967421216151024,TRUE,0.508017052195944,0.211720377116173,0.280262570687884,0.508017052195944
238
+"P17475",2,-0.188431950503736,-1.02019779232277,1.37674510675709,-0.168115363930579,TRUE,0.508585926708789,0.227498352148432,0.508585926708789,0.26391572114278
239
+"P12749",3,0.956313917933676,0.769484222618582,-0.817247616079122,-0.908550524473136,TRUE,0.508926105713666,0.198958000242343,0.29211589404399,0.508926105713666
240
+"P36970",3,0.145448674848607,1.10005973174975,-1.3274057746853,0.0818973680869483,TRUE,0.509190776121379,0.305046619623561,0.18576260425506,0.509190776121379
241
+"P62630",1,-0.729133141911815,1.13331515503016,-0.944479069125027,0.540297056006682,TRUE,0.509244001012985,0.509244001012985,0.15242627744707,0.338329721539945
242
+"P0C2X9",1,-1.00280094333105,1.20795752930497,-0.609620827231152,0.404464241257241,TRUE,0.509884267367058,0.509884267367058,0.165220722000561,0.324895010632381
243
+"P08733",1,-0.0757050126924025,-0.069497985273342,-1.14782810279411,1.29303110075986,TRUE,0.509951143656527,0.509951143656527,0.164190233417953,0.325858622925519
244
+"O88767",3,0.612427601145557,0.487241450032504,-1.49399875697727,0.394329705799209,TRUE,0.511478499752637,0.292988733704981,0.195532766542381,0.511478499752637
245
+"Q6P747",2,1.2051817455036,0.036715690593303,0.00156003589687326,-1.24345747199378,TRUE,0.513118630409142,0.153856618297619,0.513118630409142,0.333024751293239
246
+"P05964",2,0.646413874375567,-1.42297098946132,0.745897201961113,0.0306599131246435,TRUE,0.513323694205417,0.209044441100961,0.513323694205417,0.277631864693623
247
+"P38652",1,-1.20368817884026,1.14723154066156,-0.31338614506162,0.369842783240312,TRUE,0.514064161550381,0.514064161550381,0.176129848469137,0.309805989980482
248
+"O88600",2,1.34706824505792,-0.212309343460355,-0.0691360346563616,-1.06562286694121,TRUE,0.514178701118511,0.154904971115995,0.514178701118511,0.330916327765493
249
+"P10760",3,0.672820866833128,1.03756531575136,-0.791711401350385,-0.918674781234098,TRUE,0.514864730439269,0.211234615249479,0.273900654311252,0.514864730439269
250
+"P45953",1,-1.13707370631782,1.1744480942933,-0.423061177926636,0.38568678995115,TRUE,0.515563782073487,0.515563782073487,0.171051009974084,0.313385207952429
251
+"Q9Z1P2",2,-0.125135311419987,0.381364953744286,1.05638404145626,-1.31261368378056,TRUE,0.517983160902984,0.19097425750968,0.517983160902984,0.291042581587336
252
+"P63029",3,0.841328519368094,0.306937173861929,-1.45125850542196,0.302992812191932,TRUE,0.518652805123335,0.269096971597563,0.212250223279101,0.518652805123335
253
+"Q9Z269",3,0.591584816793317,1.10202872335531,-0.82038059221885,-0.873232947929777,TRUE,0.518947497019289,0.216786351000655,0.264266151980056,0.518947497019289
254
+"P53987",3,0.190682500449899,1.32298080922427,-0.940915406047772,-0.572747903626395,TRUE,0.518987560788885,0.254243441548247,0.226768997662868,0.518987560788885
255
+"P62828",3,1.08615610447503,0.150545905438982,-1.33699031518311,0.100288305269096,TRUE,0.519098707797189,0.242520851525727,0.238380440677084,0.519098707797189
256
+"Q5RKI0",1,-1.30284284624402,1.05927134854635,-0.152878765508441,0.396450263206107,TRUE,0.521250523394854,0.521250523394854,0.180336892549341,0.298412584055805
257
+"P04785",3,0.329939307396937,0.951239594020021,-1.40399419246906,0.1228152910521,TRUE,0.522412121312344,0.290307260504823,0.187280618182833,0.522412121312344
258
+"Q9QY17",3,0.7153134665451,1.00461041382569,-0.862744374132729,-0.857179506238064,TRUE,0.522445582834629,0.210915830964391,0.266638586200981,0.522445582834629
259
+"P62856",2,-0.152396877788254,0.328294406581949,1.10652350483537,-1.28242103362907,TRUE,0.523127391212643,0.190807790821324,0.523127391212643,0.286064817966033
260
+"Q3T1K5",1,-1.48313368681763,0.33006314771966,0.461237933334557,0.691832605763415,TRUE,0.523508973367637,0.523508973367637,0.207922512120424,0.268568514511939
261
+"P04639",2,0.677884923135875,0.414986278887402,0.39459433666685,-1.48746553869013,TRUE,0.524266099778887,0.16021265867265,0.524266099778887,0.315521241548463
262
+"P07335",2,1.30871692608124,-1.0524628671515,0.142750109932985,-0.399004168862721,TRUE,0.525737003997465,0.174137767766116,0.525737003997465,0.300125228236419
263
+"B0LPN4",2,1.3042496787138,-0.162345425779799,-0.0139045176986983,-1.1279997352353,TRUE,0.525762047936846,0.151505783254283,0.525762047936846,0.322732168808871
264
+"Q68FX0",3,0.743791286290024,0.469361573366731,-1.46988526953728,0.256732409880524,TRUE,0.525897523431024,0.270374054463958,0.203728422105018,0.525897523431024
265
+"P11507",2,1.0836554678088,0.14055272727641,0.114735948645809,-1.33894414373102,TRUE,0.526058866687596,0.151650782729366,0.526058866687596,0.322290350583038
266
+"P23693",1,-0.187491861704529,-0.393516382974135,-0.858670879114588,1.43967912379325,TRUE,0.526113214703142,0.526113214703142,0.174255694593491,0.299631090703368
267
+"P20767",2,-0.402545986448142,-0.323937810460321,1.47435207979616,-0.747868282887699,TRUE,0.526690226612453,0.210196608294931,0.526690226612453,0.263113165092616
268
+"P07150",2,1.28290451090511,-1.08985116702453,0.175268888033425,-0.368322231914007,TRUE,0.527015515573906,0.175401627389036,0.527015515573906,0.297582857037058
269
+"Q7TPB1",3,1.0624155063188,0.260068023185278,-1.34284156388093,0.0203580343768552,TRUE,0.527979473078362,0.237398576949807,0.234621949971831,0.527979473078362
270
+"P00406",1,-1.47943676495414,0.663095302679733,0.2696702138964,0.546671248378007,TRUE,0.528212382764552,0.528212382764552,0.196148812713625,0.275638804521823
271
+"P15651",1,-0.890769242129233,-0.619910917672807,0.171746326157539,1.3389338336445,TRUE,0.528379004986272,0.528379004986272,0.208327004006972,0.263293991006757
272
+"P68511",1,-0.798055082617286,-0.660698360641532,0.0726404894765839,1.38611295378223,TRUE,0.52873342312174,0.52873342312174,0.205835086545134,0.265431490333125
273
+"Q62930",2,-0.0184667811548216,-1.11079712957078,1.31568795357381,-0.186424042848207,TRUE,0.528814702460432,0.214000140496919,0.528814702460432,0.257185157042649
274
+"Q6PDU7",1,-0.196347107405575,-0.379932981038088,-0.86317428582984,1.4394543742735,TRUE,0.529392305678526,0.529392305678526,0.172643202158865,0.297964492162609
275
+"Q924S5",3,1.05442180351119,0.286468994771267,-1.34392001219493,0.0030292139124756,TRUE,0.529957023556612,0.236414772920093,0.233628203523295,0.529957023556612
276
+"P68035",1,-0.261905544270804,-0.498690591813308,-0.713653470739271,1.47424960682338,TRUE,0.530059189183777,0.530059189183777,0.179130338268287,0.290810472547936
277
+"Q5I0C3",1,-0.621357185331289,-0.687884989422374,-0.146525576314565,1.45576775106823,TRUE,0.53063927821018,0.53063927821018,0.198956019672377,0.270404702117443
278
+"P62083",2,1.03259857425831,0.175598603543809,0.161745750585979,-1.3699429283881,TRUE,0.530770427992099,0.151138547365368,0.530770427992099,0.318091024642533
279
+"P97541",1,-0.97693066423971,-0.559802028816361,0.243268983723973,1.2934637093321,TRUE,0.531023911229065,0.531023911229065,0.208351936882257,0.260624151888678
280
+"P61206",2,0.28526642814357,0.454508253382566,0.734289280721871,-1.47406396224801,TRUE,0.531713169426468,0.170303067412292,0.531713169426468,0.29798376316124
281
+"Q07439",3,0.862466499703706,0.427304224703055,-1.43286010027288,0.143089375866117,TRUE,0.532803993543501,0.2541829335558,0.213013072900699,0.532803993543501
282
+"P27952",3,0.961905524020887,0.359291482633127,-1.39301458321931,0.0718175765653004,TRUE,0.532901984523427,0.244446881588952,0.222651133887621,0.532901984523427
283
+"P29418",1,-0.167530871978176,-0.227053025081898,-0.994876685687839,1.38946058274791,TRUE,0.532942909817555,0.532942909817555,0.164412046243548,0.302645043938897
284
+"Q6RUV5",2,1.05643402751295,0.146727079773443,0.152945782719761,-1.35610689000615,TRUE,0.533165730456363,0.150237766547518,0.533165730456363,0.31659650299612
285
+"Q63270",3,0.333460994601858,1.22522462383142,-1.0733478752282,-0.485337743205076,TRUE,0.533550175524731,0.247562637025178,0.218887187450091,0.533550175524731
286
+"Q9JLJ3",3,0.305336219894994,1.19850115939848,-1.16398745336258,-0.33984992593089,TRUE,0.534477492200239,0.25742177460341,0.208100733196351,0.534477492200239
287
+"Q9QWN8",2,0.537310057288955,0.421651351975514,0.538778728784445,-1.49774013804891,TRUE,0.53544329207923,0.161153810899638,0.53544329207923,0.303402897021132
288
+"P63245",2,0.800249147274074,-1.3767364425039,0.674267785064973,-0.0977804898351472,TRUE,0.535934648267952,0.192959011512163,0.535934648267952,0.271106340219884
289
+"Q5I0K3",3,0.966957100596458,0.727402116859742,-1.07129291389388,-0.623066303562316,TRUE,0.537141904459673,0.207376506777245,0.255481588763082,0.537141904459673
290
+"P05508",2,0.933293948421451,0.234674396408758,0.25022662416073,-1.41819496899094,TRUE,0.538042408985652,0.150903126754687,0.538042408985652,0.311054464259661
291
+"Q68FS4",1,-0.189784260054557,-0.231110040310402,-0.977406813456026,1.39830111382098,TRUE,0.5387906698362,0.5387906698362,0.162966137128698,0.298243193035102
292
+"P41562",1,-0.768220641568104,1.07708462548251,-0.929682685326178,0.620818701411769,TRUE,0.539750599723357,0.539750599723357,0.144432552361974,0.315816847914669
293
+"Q78P75",2,0.983307677905425,0.191427891032889,0.22085852809513,-1.39559409703344,TRUE,0.539848901349504,0.149603539087974,0.539848901349504,0.310547559562521
294
+"P62198",1,-1.48578407644085,0.458230935720076,0.348644260921328,0.678908879799445,TRUE,0.540303256480979,0.540303256480979,0.195389155526707,0.264307587992313
295
+"P25886",3,0.747505797435708,0.612199345127119,-1.4355138734764,0.0758087309135692,TRUE,0.540495757260366,0.254635038275051,0.204869204464583,0.540495757260366
296
+"P62853",1,-0.210996767304818,-0.260664706358473,-0.942367464273936,1.41402893793723,TRUE,0.542636286111969,0.542636286111969,0.16320774600926,0.294155967878771
297
+"Q5U300",1,-0.222349946851389,-0.289018159268012,-0.91399118707545,1.42535929319485,TRUE,0.543498441198388,0.543498441198388,0.164266200948524,0.292235357853089
298
+"Q63704",1,-1.38721342397836,0.00626154270392772,0.443407468124519,0.937544413149911,TRUE,0.543506774946964,0.543506774946964,0.201522833232373,0.254970391820663
299
+"O35878",1,-1.36655654286555,-0.0420760931990507,0.441039025202742,0.967593610861856,TRUE,0.543667043783346,0.543667043783346,0.201906538108801,0.254426418107853
300
+"Q5XIM9",2,1.29156669513146,-0.201371932514382,0.0452595050762073,-1.13545426769328,TRUE,0.543706455307404,0.147250075704605,0.543706455307404,0.30904346898799
301
+"Q5XI73",3,0.703335293381523,0.69438526211049,-1.42216422396268,0.0244436684706651,TRUE,0.543733070829057,0.25316245211589,0.203104477055054,0.543733070829057
302
+"P11517",2,0.45818689951494,-1.33958907498564,0.991668862577832,-0.110266687107128,TRUE,0.544204702736954,0.197928432743675,0.544204702736954,0.257866864519371
303
+"P12007",2,1.08825267729644,-1.25325768989134,0.422677421594451,-0.257672408999547,TRUE,0.54442319197409,0.178199540583838,0.54442319197409,0.277377267442072
304
+"Q9JM53",1,-0.825538455960121,-0.602350114046033,0.0297558191317942,1.39813275087436,TRUE,0.545337941385586,0.545337941385586,0.196173789505752,0.258488269108661
305
+"Q4G069",2,1.31219701807565,-0.997970649526584,0.184079183086686,-0.498305551635749,TRUE,0.54623356141962,0.164919016040727,0.54623356141962,0.288847422539654
306
+"P62282",3,0.902809750274333,0.742355741223915,-1.19712096881397,-0.448044522684274,TRUE,0.548259448630941,0.216302555087353,0.235437996281706,0.548259448630941
307
+"P0CG51",1,-1.42281826509725,0.124287889190763,0.407345638794595,0.891184737111889,TRUE,0.551386037057908,0.551386037057908,0.19556325303569,0.253050709906402
308
+"P10959",2,0.588138371564071,-1.34990669168875,0.901316524954791,-0.139548204830107,TRUE,0.55189314360282,0.191019005199865,0.55189314360282,0.257087851197315
309
+"P97532",2,1.38156794344043,-0.688562095462086,0.0876765928495033,-0.780682440827852,TRUE,0.555647221264252,0.15208577923088,0.555647221264252,0.292266999504868
310
+"P50753",1,-0.252765265787015,-0.235628931438395,-0.930818705778685,1.4192129030041,TRUE,0.555667670536643,0.555667670536643,0.158452165306274,0.285880164157084
311
+"Q5XIT9",1,-0.305147632512247,-0.3647066519782,-0.794125912121558,1.46398019661201,TRUE,0.556103280003594,0.556103280003594,0.164478385984714,0.279418334011692
312
+"P18266",1,-1.46558429178467,0.639160053570951,0.187326529881207,0.639097708332513,TRUE,0.556188434643559,0.556188434643559,0.181700019619709,0.262111545736732
313
+"P08010",2,1.29791388180563,-0.994615312919407,0.222626632347056,-0.525925201233283,TRUE,0.557209242065193,0.16114758803487,0.557209242065193,0.281643169899936
314
+"P50399",1,-0.9544226834536,1.09904990646176,-0.73212726989488,0.587500046886722,TRUE,0.559505094727538,0.559505094727538,0.145275824521876,0.295219080750586
315
+"P62076",1,-0.516422992830342,0.797668375503833,-1.15489163312675,0.873646250453264,TRUE,0.560566456856531,0.560566456856531,0.133404743273825,0.306028799869643
316
+"P07871",1,-1.13462557060349,1.08530023761622,-0.49183114495319,0.541156477940463,TRUE,0.562396350183541,0.562396350183541,0.15287944085511,0.284724208961349
317
+"P26644",2,-0.18142369944573,-0.046129600413803,1.32601986997816,-1.09846657011863,TRUE,0.563237082425832,0.181629280548062,0.563237082425832,0.255133637026106
318
+"P35704",2,0.608709082732501,-1.32824145137973,0.910395135919007,-0.190862767271781,TRUE,0.563574806356585,0.184699621393139,0.563574806356585,0.251725572250276
319
+"Q9EQX9",1,-0.683348229493468,-0.56950281760202,-0.217340991812806,1.47019203890829,TRUE,0.564025637798731,0.564025637798731,0.180642028089756,0.255332334111513
320
+"P50878",2,0.663423439439013,0.292640425534987,0.526259326160386,-1.48232319113439,TRUE,0.564778663452695,0.149632919804677,0.564778663452695,0.285588416742628
321
+"P19804",2,0.983718307210816,0.117568727787527,0.289612193453449,-1.39089922845179,TRUE,0.565187797735101,0.143075197677343,0.565187797735101,0.291737004587556
322
+"P29117",1,-0.273365045923739,0.226397644372468,-1.17503886678108,1.22200626833235,TRUE,0.566007661323546,0.566007661323546,0.139741099487517,0.294251239188936
323
+"P80432",1,-0.465807686514058,0.706489302275282,-1.18216288451876,0.941481268757534,TRUE,0.56610443747241,0.56610443747241,0.132090169724762,0.301805392802828
324
+"Q8VID1",1,-1.13989967801832,-0.333455602122196,0.234657623184426,1.23869765695609,TRUE,0.568202072330228,0.568202072330228,0.188070554247812,0.24372737342196
325
+"P56741",1,-0.466576815510493,-0.481388901237946,-0.551017458925199,1.49898317567364,TRUE,0.568269182201529,0.568269182201529,0.168488402963405,0.263242414835067
326
+"P62268",1,-1.17123237595056,-0.298629652425309,0.255980149804675,1.21388187857119,TRUE,0.568592060080941,0.568592060080941,0.188069595696525,0.243338344222534
327
+"P14882",2,1.05246188612569,-1.23292864125681,0.512090473610902,-0.331623718479786,TRUE,0.568664265449224,0.168771681085764,0.568664265449224,0.262564053465012
328
+"P24049",1,-1.44768380493906,0.67905263983675,0.112560012907536,0.65607115219477,TRUE,0.56916175087259,0.56916175087259,0.17360373095483,0.257234518172581
329
+"Q63065",2,0.0618231831691719,0.207214335769613,1.07317522490248,-1.34221274384127,TRUE,0.569321397337367,0.167584699866972,0.569321397337367,0.263093902795661
330
+"P23514",1,-0.874598615199346,-0.506593661460024,-0.0251531445578931,1.40634542121726,TRUE,0.572349521028123,0.572349521028123,0.181356857086806,0.246293621885071
331
+"P62836",1,-0.78650523727053,-0.522089634730003,-0.137100585080301,1.44569545708083,TRUE,0.575669789956435,0.575669789956435,0.177148990352901,0.247181219690664
332
+"P62898",1,-0.287887149406363,-0.0549052405836734,-1.02345799955041,1.36625038954044,TRUE,0.576205603440116,0.576205603440116,0.145553724342019,0.278240672217865
333
+"P11250",1,-0.59107029448575,-0.506463269412623,-0.397763962868612,1.49529752676699,TRUE,0.577113564493019,0.577113564493019,0.16942185463735,0.253464580869631
334
+"P62890",2,0.926403337077201,0.124373122992671,0.361810338159014,-1.41258679822889,TRUE,0.577547204281168,0.140662559818878,0.577547204281168,0.281790235899954
335
+"Q5XIG4",1,-0.300333451638261,0.191172936765903,-1.14276988288864,1.251930397761,TRUE,0.578426941363936,0.578426941363936,0.137347016397071,0.284226042238993
336
+"P17702",1,-1.25236968612297,-0.170035975090315,0.26902695839654,1.15337870281675,TRUE,0.579305868861176,0.579305868861176,0.182154414551203,0.238539716587621
337
+"P62703",1,-1.42004877362002,0.741565259607286,0.020358936137696,0.658124577875038,TRUE,0.580333932346233,0.580333932346233,0.165704618581295,0.253961449072472
338
+"Q5XHZ0",1,-0.296574095675679,0.0508057301762476,-1.07696196130695,1.32273032680638,TRUE,0.580884344723686,0.580884344723686,0.140727136140459,0.278388519135855
339
+"P06399",2,-0.0612782451964428,-0.770507479275509,1.42995140475916,-0.598165680287207,TRUE,0.582094147707639,0.182861278635751,0.582094147707639,0.23504457365661
340
+"P30009",2,1.30231981507758,-0.402459114903677,0.15715906681493,-1.05701976698883,TRUE,0.583675470771546,0.138516644387616,0.583675470771546,0.277807884840838
341
+"Q66H98",2,1.2155479347593,-0.208529947284694,0.193597836611944,-1.20061582408655,TRUE,0.584142060043609,0.136767934749057,0.584142060043609,0.279090005207334
342
+"P20059",2,-0.0267638237320822,-0.816942812229043,1.41582708410926,-0.572120448148132,TRUE,0.584595508078041,0.181653851871271,0.584595508078041,0.233750640050689
343
+"P34064",2,-0.112467051915412,-0.612979266679844,1.44634472614474,-0.720898407549486,TRUE,0.584734605449779,0.180185945299271,0.584734605449779,0.235079449250951
344
+"P46462",1,-0.818871342991928,0.992382909837861,-0.902100113130873,0.72858854628494,TRUE,0.585894658120775,0.585894658120775,0.132062425157188,0.282042916722037
345
+"P14480",2,-0.0907631949489523,-0.66583164858452,1.44183218367045,-0.685237340136973,TRUE,0.585904290021348,0.180017467934228,0.585904290021348,0.234078242044425
346
+"P11608",1,-1.44366298618524,0.605500295924797,0.10447983028852,0.733682859971923,TRUE,0.587552325777637,0.587552325777637,0.166421124776111,0.246026549446252
347
+"P83732",1,-0.317472537614832,0.0885287910554093,-1.082433766583,1.31137751314242,TRUE,0.588197185723774,0.588197185723774,0.13755126637692,0.274251547899306
348
+"P48679",2,1.31470890802267,-0.801484641816074,0.242117895262323,-0.755342161468919,TRUE,0.591070744977604,0.144073974319967,0.591070744977604,0.264855280702429
349
+"Q9WVK7",1,-0.325989379400244,0.0233738739010767,-1.04188052125684,1.344496026756,TRUE,0.591101781891451,0.591101781891451,0.138741918388635,0.270156299719914
350
+"P23562",2,0.546266988589785,-1.248003765712,1.02089142016628,-0.319154643044071,TRUE,0.59302499466231,0.171540913987515,0.59302499466231,0.235434091350175
351
+"P16409",1,-0.975974365973671,-0.401368409620039,0.00389373191821932,1.37344904367549,TRUE,0.593456280447323,0.593456280447323,0.171609907815399,0.234933811737279
352
+"P62271",2,0.0854748796023107,0.0812866374284336,1.13567252697943,-1.30243404401018,TRUE,0.593844804084872,0.15929364456504,0.593844804084872,0.246861551350088
353
+"P06761",1,-1.42387868722725,0.673319488498184,0.0306487859785608,0.719910412750502,TRUE,0.594625879949218,0.594625879949218,0.160830590217265,0.244543529833517
354
+"P38718",2,0.178123553838043,0.121633850559722,1.05605453708522,-1.35581194148298,TRUE,0.599083056060646,0.154085688510371,0.599083056060646,0.246831255428983
355
+"Q99NA5",1,-0.580187168589801,0.74511314966662,-1.10583705557537,0.940911074498555,TRUE,0.600121827733554,0.600121827733554,0.123889736142665,0.275988436123781
356
+"P13221",1,-1.1224818875927,-0.273927564884718,0.110829879254903,1.28557957322252,TRUE,0.600604261270608,0.600604261270608,0.169756082320634,0.229639656408758
357
+"P04276",2,0.0148307821100795,-0.761473927006031,1.40801947847706,-0.661376333581112,TRUE,0.602634137160375,0.171442695119988,0.602634137160375,0.225923167719637
358
+"Q07936",2,1.2162882689319,-0.286503049997499,0.244441082290886,-1.17422630122529,TRUE,0.604073430094348,0.131790479286072,0.604073430094348,0.26413609061958
359
+"Q704S8",1,-1.1708652328928,0.986630708690962,-0.472977097770467,0.65721162197231,TRUE,0.605425894296767,0.605425894296767,0.13926712860791,0.255306977095323
360
+"Q62736",2,-0.00444423298826263,-0.691728306745138,1.41559835314755,-0.719425813414146,TRUE,0.605496994139116,0.169458477561121,0.605496994139116,0.225044528299763
361
+"P27139",2,0.39048467889667,-1.14392996813123,1.1689050862377,-0.415459797003141,TRUE,0.607462375192754,0.166953067058612,0.607462375192754,0.225584557748634
362
+"B0BNE5",2,0.5619290649879,-1.20431251431397,1.03796883290679,-0.39558538358072,TRUE,0.611820112722277,0.162141632053747,0.611820112722277,0.226038255223976
363
+"Q63798",2,0.480211732431078,0.15571451110359,0.809633567980214,-1.44555981151488,TRUE,0.613200847043615,0.140247896021419,0.613200847043615,0.246551256934966
364
+"P13086",1,-0.491206664955999,-0.264756821418305,-0.718120314435605,1.47408380080991,TRUE,0.613606827113442,0.613606827113442,0.143521058111757,0.242872114774801
365
+"P31000",2,0.0979410436793736,-0.833309874393075,1.37406867263867,-0.638699841924972,TRUE,0.613839215259356,0.165645375662515,0.613839215259356,0.220515409078129
366
+"P29314",1,-1.4241520833368,0.432312680389291,0.113150914029928,0.878688488917583,TRUE,0.615145339848809,0.615145339848809,0.156751115482568,0.228103544668624
367
+"P61980",2,1.28512705913331,-0.585331025514121,0.266940206762592,-0.966736240381781,TRUE,0.615720387586631,0.131877164709663,0.615720387586631,0.252402447703706
368
+"P11915",1,-1.23484836506617,-0.106458011927366,0.139491815415058,1.20181456157848,TRUE,0.616183725022609,0.616183725022609,0.161966743232898,0.221849531744493
369
+"Q99PS8",2,0.873425984156391,-1.20645703369901,0.769065786599691,-0.436034737057076,TRUE,0.616567035527315,0.153034190833282,0.616567035527315,0.230398773639403
370
+"Q4QQT4",2,0.0402508693423748,-0.695572132878278,1.40000299693385,-0.74468173339795,TRUE,0.616664118262032,0.16349735699909,0.616664118262032,0.219838524738878
371
+"P09006",2,0.0251629809272163,-0.635286016383908,1.40270750860621,-0.792584473149514,TRUE,0.618168145552724,0.162222900869803,0.618168145552724,0.219608953577473
372
+"Q02253",1,-1.38332891742223,0.705245497454493,-0.084710182239651,0.76279360220739,TRUE,0.621039677069081,0.621039677069081,0.146862793024248,0.232097529906671
373
+"P81155",1,-0.45437280199218,-0.149877749807794,-0.835530790810652,1.43978134261063,TRUE,0.621218706011247,0.621218706011247,0.136232954981974,0.242548339006779
374
+"P20761",2,1.25414499282135,-0.472901286199923,0.279569852816653,-1.06081355943808,TRUE,0.621533386410938,0.128536819249172,0.621533386410938,0.24992979433989
375
+"P04762",1,-1.17665763556217,0.950518518461888,-0.472772529641214,0.698911646741496,TRUE,0.621810883874535,0.621810883874535,0.133791200633196,0.24439791549227
376
+"P10860",1,-1.24546504676826,0.905248286711624,-0.364432841381446,0.704649601438082,TRUE,0.623474731565629,0.623474731565629,0.136640711310365,0.239884557124005
377
+"P02401",1,-1.32729837485102,0.0744205458635489,0.153211073339472,1.099666755648,TRUE,0.6236091762858,0.6236091762858,0.157388298251042,0.219002525463158
378
+"P02651",2,0.908514198456601,-1.17523835602384,0.748929243932219,-0.48220508636498,TRUE,0.626245527070035,0.147728373791282,0.626245527070035,0.226026099138683
379
+"P02680",2,0.0739924899379389,-0.682732467077885,1.38675608187179,-0.778016104731848,TRUE,0.626720108959303,0.158099915520695,0.626720108959303,0.215179975520002
380
+"P07340",2,1.08387060678733,-0.167734548356789,0.371822623296161,-1.2879586817267,TRUE,0.626860912332252,0.125470687271991,0.626860912332252,0.247668400395758
381
+"Q2TA68",1,-0.458730967076316,-0.113103111523554,-0.85716573969834,1.42899981829821,TRUE,0.626936613175422,0.626936613175422,0.133151531518083,0.239911855306494
382
+"P18418",2,0.382490457142129,0.0804148684808296,0.939037368943889,-1.40194269456685,TRUE,0.628202199848659,0.138387420674364,0.628202199848659,0.233410379476976
383
+"B0BNN3",2,0.390558126887882,-1.0686431425499,1.19798561979193,-0.519900604129914,TRUE,0.630455621938527,0.15557986014228,0.630455621938527,0.213964517919194
384
+"P56571",1,-0.451176814948704,-0.0449160819376839,-0.907671498563243,1.40376439544963,TRUE,0.631352496540297,0.631352496540297,0.12943551580099,0.239211987658713
385
+"Q62651",1,-1.15280996392757,0.938932406834555,-0.512158676524643,0.726036233617657,TRUE,0.632043784763015,0.632043784763015,0.129170038139603,0.238786177097382
386
+"Q68FT1",2,1.0953420321444,-1.04839999668325,0.568129143791432,-0.61507117925258,TRUE,0.634673225006791,0.138002355326716,0.634673225006791,0.227324419666493
387
+"P23764",2,1.14076870532357,-0.995727031920226,0.517672307678158,-0.662713981081502,TRUE,0.635809950059092,0.135627252347233,0.635809950059092,0.228562797593676
388
+"P42930",1,-1.39057076074652,0.603721914117707,-0.0494453408659702,0.836294187494779,TRUE,0.636357335381422,0.636357335381422,0.142563611849351,0.221079052769228
389
+"Q01177",2,1.24932283618298,-0.699201362739387,0.356996652904822,-0.907118126348413,TRUE,0.63687524742967,0.127493545766101,0.63687524742967,0.23563120680423
390
+"Q9JJW3",1,-0.588897268266176,-0.252317692185216,-0.636680201721688,1.47789516217308,TRUE,0.637032851075613,0.637032851075613,0.136527505867901,0.226439643056486
391
+"P62494",1,-0.875226642368928,-0.321562156996831,-0.242564692226915,1.43935349159267,TRUE,0.637638441383837,0.637638441383837,0.146182142392453,0.21617941622371
392
+"P31399",1,-0.470208570391622,-0.0412241154858339,-0.894592914726523,1.40602560060398,TRUE,0.638121269712199,0.638121269712199,0.127334343787163,0.234544386500638
393
+"P47853",2,0.0975859407159747,-0.607614700796025,1.37108263321649,-0.861053873136442,TRUE,0.639039033521802,0.151090671624605,0.639039033521802,0.209870294853593
394
+"Q5BJQ0",2,1.08726159627616,-1.04336610793286,0.581494870801643,-0.625390359144938,TRUE,0.6390576031934,0.136407975799021,0.6390576031934,0.224534421007579
395
+"Q01129",2,1.06209980219484,-1.06407929662946,0.609133357503201,-0.607153863068581,TRUE,0.639332553599483,0.137210904593394,0.639332553599483,0.223456541807123
396
+"P18886",1,-1.03809119653527,0.941345795275714,-0.669803783620534,0.766549184880087,TRUE,0.639563846812105,0.639563846812105,0.122173464987681,0.238262688200214
397
+"P58775",2,0.340197608778361,0.011671454259343,1.01196770464695,-1.36383676768466,TRUE,0.639999078612116,0.135988628644873,0.639999078612116,0.224012292743011
398
+"P31232",2,0.0852877705736374,-0.475230474522176,1.35489685305067,-0.964954149102127,TRUE,0.641059402169132,0.148538180523967,0.641059402169132,0.210402417306902
399
+"O35413",1,-0.781381830599306,0.835071675856656,-0.946262246603309,0.892572401345959,TRUE,0.641405776894797,0.641405776894797,0.114830230340837,0.243763992764366
400
+"Q8K4G6",2,0.977227619618984,-1.10964231740671,0.700617815697088,-0.568203117909363,TRUE,0.642401258654267,0.13862343306121,0.642401258654267,0.218975308284523
401
+"P13635",2,0.283953775325823,-0.922570200750295,1.28479229045635,-0.646175865031879,TRUE,0.643811063112206,0.149778204025983,0.643811063112206,0.206410732861811
402
+"Q8VHF5",1,-0.630732436452763,0.667069504356059,-1.05656505713357,1.02022798923028,TRUE,0.644050291705557,0.644050291705557,0.112702637793693,0.24324707050075
403
+"P04166",1,-1.38864635228415,0.381825318512846,0.0456843774702084,0.961136656301095,TRUE,0.644151334060149,0.644151334060149,0.143554071576934,0.212294594362917
404
+"P01026",2,0.426633978530632,-1.04042852269756,1.18641988870454,-0.572625344537611,TRUE,0.645621411063751,0.147814700930749,0.645621411063751,0.206563888005501
405
+"P47858",2,1.09377304025547,-1.01669877290107,0.580742254098493,-0.657816521452892,TRUE,0.645961772979006,0.133165127045242,0.645961772979006,0.220873099975752
406
+"P48721",1,-0.962941416308281,0.915262859291596,-0.761622720814342,0.809301277831027,TRUE,0.64696773391618,0.64696773391618,0.117397022745653,0.235635243338167
407
+"P62250",2,0.1862367106406,-0.175732438444619,1.20602380847882,-1.2165280806748,TRUE,0.647922833298704,0.139135643589474,0.647922833298704,0.212941523111821
408
+"P11232",1,-1.10827386841977,0.914194174504143,-0.580139811657746,0.774219505573374,TRUE,0.650131579364164,0.650131579364164,0.121226929858279,0.228641490777557
409
+"B0K020",1,-0.737154900693624,-0.282206753622316,-0.45401334358513,1.47337499790107,TRUE,0.650281868206046,0.650281868206046,0.13593693049073,0.213781201303223
410
+"Q07969",1,-1.38245722875248,0.400738690947735,0.0184532631653863,0.963265274639362,TRUE,0.651076733504222,0.651076733504222,0.139938243650979,0.208985022844799
411
+"Q63041",2,0.170731195865037,-0.691886992252908,1.34601365554104,-0.824857859153172,TRUE,0.651217770373632,0.145545135813038,0.651217770373632,0.203237093813329
412
+"P01946",2,0.562191521135483,-1.09254439867149,1.08665387094115,-0.556300993405134,TRUE,0.651920299867768,0.143143560656493,0.651920299867768,0.20493613947574
413
+"P35171",1,-1.38077398054179,0.4633691767383,-0.0198038330037166,0.937208636807204,TRUE,0.654934191765428,0.654934191765428,0.136990649418539,0.208075158816033
414
+"P20759",2,0.162063304269774,-0.596716697311395,1.34053702466903,-0.905883631627405,TRUE,0.656660599878407,0.142049382210001,0.656660599878407,0.201290017911593
415
+"Q9QX79",2,1.00288406721337,-1.05457723129276,0.689455774020256,-0.637762609940871,TRUE,0.657907385624188,0.1310968452156,0.657907385624188,0.210995769160212
416
+"Q7TQ16",1,-0.499977124470033,0.12996983278078,-0.969266257518969,1.33927354920822,TRUE,0.659387213033277,0.659387213033277,0.116092678596999,0.224520108369723
417
+"Q5XIM5",1,-0.908053298894656,-0.24967146778828,-0.27053153200154,1.42825629868448,TRUE,0.660909112636759,0.660909112636759,0.135365884654262,0.203725002708979
418
+"P08649",2,0.339763624111834,-0.898697034072057,1.25944146034262,-0.700508050382392,TRUE,0.662151146336965,0.140417972421217,0.662151146336965,0.197430881241818
419
+"P40307",2,0.946725307607577,-0.150731489062729,0.541201720027968,-1.33719553857282,TRUE,0.66328043761734,0.11611344647052,0.66328043761734,0.22060611591214
420
+"P12075",1,-1.26793202105795,0.0743770286177042,0.0160324197879628,1.17752257265228,TRUE,0.664364897470534,0.664364897470534,0.137131466676358,0.198503635853108
421
+"P62260",1,-1.13114051320034,0.878930425527785,-0.550724876570803,0.80293496424336,TRUE,0.664491939147751,0.664491939147751,0.11728113881776,0.218226922034489
422
+"P15800",1,-0.784297472230128,0.778381404337792,-0.940170367838262,0.946086435730598,TRUE,0.665189228435373,0.665189228435373,0.107974936341167,0.22683583522346
423
+"Q68FP1",2,0.534522985379896,-1.03781470847353,1.12071850802388,-0.617426784930247,TRUE,0.665504388824141,0.137168588007559,0.665504388824141,0.1973270231683
424
+"P21396",1,-0.788588412440127,0.776538914982373,-0.936058855334124,0.948108352791878,TRUE,0.667382189548503,0.667382189548503,0.107396324662129,0.225221485789369
425
+"Q64560",2,1.14214132967965,-0.858480449230577,0.535772966562172,-0.819433847011242,TRUE,0.669654511466868,0.120685300670224,0.669654511466868,0.209660187862908
426
+"P11884",1,-0.934130101211601,-0.21801463435277,-0.265400099792983,1.41754483535735,TRUE,0.670019933280165,0.670019933280165,0.131494063315033,0.198486003404802
427
+"Q6NYB7",2,0.224068341391805,-0.635255378800842,1.315031798246,-0.903844760836961,TRUE,0.670411469364627,0.135543763768488,0.670411469364627,0.194044766866884
428
+"Q9WTT6",2,0.80890406594525,-1.08222417923816,0.890686944696315,-0.617366831403408,TRUE,0.67110004252714,0.130173985227527,0.67110004252714,0.198725972245334
429
+"P60868",1,-1.35936752610052,0.493426954703629,-0.0836162185579383,0.949556789954831,TRUE,0.67187522941289,0.67187522941289,0.128561441702029,0.199563328885081
430
+"Q9WUS0",2,1.15582439339274,-0.489244716590903,0.44212790261472,-1.10870757941655,TRUE,0.672050182113176,0.113762228844873,0.672050182113176,0.214187589041951
431
+"P02466",2,1.12897992566093,-0.86866329718979,0.554292571526405,-0.814609199997548,TRUE,0.672888878530329,0.11991776190349,0.672888878530329,0.207193359566182
432
+"Q4QQV3",1,-0.66920500946155,-0.165917039675088,-0.625492610864666,1.4606146600013,TRUE,0.672924720914109,0.672924720914109,0.122269734034961,0.204805545050929
433
+"P06866",2,0.357087461355177,-0.865334063347174,1.25275441395408,-0.744507811962079,TRUE,0.673119455464678,0.134967967210695,0.673119455464678,0.191912577324627
434
+"Q9Z1Y3",1,-0.846558817209897,0.806062699653354,-0.883295278716713,0.923791396273256,TRUE,0.673192844370483,0.673192844370483,0.106594410064695,0.220212745564822
435
+"Q5XIN6",1,-0.998710018616846,0.8672376187346,-0.722246894865003,0.85371929474725,TRUE,0.673859661513254,0.673859661513254,0.109879596615973,0.216260741870773
436
+"Q6AXV4",1,-1.19076943099747,0.830227067268889,-0.463077782910879,0.82362014663946,TRUE,0.67469566093794,0.67469566093794,0.116202134528736,0.209102204533324
437
+"P47875",2,0.887628485937433,-1.05443716804006,0.820413622334687,-0.653604940232057,TRUE,0.676433948439423,0.126114657959248,0.676433948439423,0.197451393601329
438
+"P38983",1,-1.15720818305547,0.839460259971627,-0.514065048207758,0.831812971291606,TRUE,0.6786347343189,0.6786347343189,0.113516999276342,0.207848266404758
439
+"P14604",1,-1.34906799541284,0.418209969856853,-0.0692987838597552,1.00015680941574,TRUE,0.679568887192998,0.679568887192998,0.126391731625988,0.194039381181014
440
+"Q63081",2,0.580223922754806,-0.0831099267384291,0.876803339177833,-1.37391733519421,TRUE,0.680384061712533,0.116948138547368,0.680384061712533,0.202667799740099
441
+"P51886",2,0.344380836895407,-0.203032373733553,1.11890342464338,-1.26025188780523,TRUE,0.680999771240182,0.123105950353962,0.680999771240182,0.195894278405856
442
+"P29457",2,0.483765543336224,-0.114659136138129,0.974046039380017,-1.34315244657811,TRUE,0.682544192928436,0.118544298226665,0.682544192928436,0.198911508844899
443
+"P62243",2,0.302790675173723,-0.304602976459511,1.187399553815,-1.18558725252922,TRUE,0.686052556130909,0.123255478174282,0.686052556130909,0.190691965694809
444
+"Q811A2",1,-1.24764052788887,0.102871307721149,-0.0511385745272793,1.195907794695,TRUE,0.686581993554895,0.686581993554895,0.126384132780531,0.187033873664574
445
+"O35303",1,-1.3054140144265,0.238038045433344,-0.0449251895122416,1.1123011585054,TRUE,0.686805447731181,0.686805447731181,0.12536795531639,0.187826596952429
446
+"Q05962",1,-0.708480998497477,-0.134760379718754,-0.609002011946463,1.45224339016269,TRUE,0.688368994401162,0.688368994401162,0.116497394045038,0.1951336115538
447
+"P63018",1,-1.33518853352291,0.512504082016222,-0.143728171804577,0.966412623311266,TRUE,0.689433857850903,0.689433857850903,0.120230152628597,0.1903359895205
448
+"O35115",2,0.441607480316347,-0.175471856152593,1.03714122390325,-1.30327684806701,TRUE,0.690911964303579,0.117011059574824,0.690911964303579,0.192076976121596
449
+"O08557",2,0.370248667582816,-0.24542399633617,1.1197239481654,-1.24454861941204,TRUE,0.691916176475283,0.118895905353884,0.691916176475283,0.189187918170833
450
+"Q66HD0",2,0.673597714134831,-0.129521144222161,0.819172220800402,-1.36324879071307,TRUE,0.693364376716733,0.110943284864381,0.693364376716733,0.195692338418887
451
+"P29419",1,-0.606514491268633,0.400529539212232,-1.00391794488732,1.20990289694372,TRUE,0.693478385809795,0.693478385809795,0.100980224920695,0.20554138926951
452
+"Q5XIF6",1,-0.59300662846968,0.0749073486863052,-0.860887544919984,1.37898682470336,TRUE,0.693482437964656,0.693482437964656,0.107357644578428,0.199159917456916
453
+"O88761",1,-1.18781959870219,0.785649276296788,-0.466361215475405,0.868531537880808,TRUE,0.695205502378685,0.695205502378685,0.109117059514184,0.195677438107131
454
+"Q8VIF7",2,0.680844497284992,-0.138035453509965,0.817190020421299,-1.35999906419633,TRUE,0.695576575962565,0.110110189847833,0.695576575962565,0.194313234189602
455
+"P20280",2,1.10868184216276,-0.514436491178559,0.518234884361035,-1.11248023534523,TRUE,0.695578066082771,0.106877851282764,0.695578066082771,0.197544082634465
456
+"P41123",1,-1.2974212707702,0.254523149680236,-0.073571009260818,1.11646913035078,TRUE,0.696302541186187,0.696302541186187,0.120845471842882,0.182851986970931
457
+"P04636",1,-0.587545692388514,0.16668498401202,-0.916167246451181,1.33702795482767,TRUE,0.697183736413044,0.697183736413044,0.103986894219879,0.198829369367077
458
+"P42123",1,-0.685045635814527,-0.0774279367606676,-0.675653562098333,1.43812713467353,TRUE,0.697563402355259,0.697563402355259,0.111180847221168,0.191255750423573
459
+"Q6P6R2",1,-0.597410135732198,0.321110766983129,-0.980290822417484,1.25659019116655,TRUE,0.697993780786458,0.697993780786458,0.100800076763542,0.20120614245
460
+"P01836",2,0.53098960676532,-0.920346061893419,1.14209944837598,-0.752742993247878,TRUE,0.698116606695769,0.122102183200254,0.698116606695769,0.179781210103978
461
+"P80254",1,-1.20149526553049,0.0621757201132562,-0.102470718137978,1.24179026355521,TRUE,0.698652256047547,0.698652256047547,0.120797068902385,0.180550675050068
462
+"B2GV54",1,-1.23803880474347,0.123656648578671,-0.0874193299247909,1.20180148608959,TRUE,0.699258818791281,0.699258818791281,0.120369793879433,0.180371387329285
463
+"P12346",2,0.492406583688901,-0.881852948783289,1.17043750995543,-0.780991144861046,TRUE,0.699939169863996,0.121540756178779,0.699939169863996,0.178520073957225
464
+"B4F7A1",1,-0.773188375230204,0.67730065186968,-0.936649032779207,1.03253675613973,TRUE,0.699951628973687,0.699951628973687,0.097789289792444,0.202259081233869
465
+"P63039",1,-0.628353206257789,0.0262462865979627,-0.799677435819485,1.40178435547931,TRUE,0.700513798890143,0.700513798890143,0.106618986211367,0.192867214898489
466
+"P24268",1,-1.27997407702023,0.656657100901126,-0.295056349254152,0.91837332537326,TRUE,0.701553231841618,0.701553231841618,0.111396850290064,0.187049917868318
467
+"P62963",1,-1.28391328785573,0.239481903951613,-0.0896652724132517,1.13409665631737,TRUE,0.702409016545482,0.702409016545482,0.118195017690135,0.179395965764383
468
+"P04937",2,0.753607266463898,-0.986941201935232,0.962480419134432,-0.729146483663098,TRUE,0.704256966538985,0.116577783883089,0.704256966538985,0.179165249577926
469
+"P32551",1,-0.826939415852127,0.7161688214401,-0.892543592377494,1.00331418678952,TRUE,0.70490875971914,0.70490875971914,0.0968366283501322,0.198254611930727
470
+"Q5XIC0",1,-0.925292031940247,0.768427646825985,-0.79936345267094,0.956227837785201,TRUE,0.710057431376197,0.710057431376197,0.096777673971909,0.193164894651894
471
+"P56574",1,-0.69779180033383,-0.0361393573241674,-0.691914272275097,1.42584542993309,TRUE,0.710183114854238,0.710183114854238,0.10584050867647,0.183976376469292
472
+"Q6UPE1",1,-0.801987920857487,0.676482923806955,-0.909695566014417,1.03520056306495,TRUE,0.711470251518453,0.711470251518453,0.0946472254357841,0.193882523045763
473
+"P11762",2,0.488807019107611,-0.25298621879045,1.03735146328237,-1.27317226359953,TRUE,0.711829310798389,0.109120801005729,0.711829310798389,0.179049888195882
474
+"P26772",1,-0.62356012123183,0.1530894551725,-0.877658433264579,1.34812909932391,TRUE,0.711930397422097,0.711930397422097,0.0998291695051151,0.188240433072788
475
+"P04906",1,-1.21582740418125,0.125221122690545,-0.129742177385399,1.22034845887611,TRUE,0.712780274341802,0.712780274341802,0.114125999493336,0.173093726164862
476
+"P36201",1,-0.68038849577225,0.0094772643020312,-0.739700358071874,1.41061158954209,TRUE,0.714711433267904,0.714711433267904,0.10286396675135,0.182424599980746
477
+"D3ZAF6",1,-0.795794121431482,0.657100799760661,-0.911803770166623,1.05049709183744,TRUE,0.716324407732798,0.716324407732798,0.0931761802588195,0.190499412008383
478
+"P12847",1,-0.685126579506199,0.0107111177813645,-0.735887962564606,1.41030342428944,TRUE,0.716396894472427,0.716396894472427,0.102316686879249,0.181286418648324
479
+"P14046",2,0.793894451710395,-0.944825897768602,0.931516385006709,-0.780584938948503,TRUE,0.718011181216017,0.109907181079897,0.718011181216017,0.172081637704086
480
+"Q2PQA9",1,-0.895317258570602,0.731349948043854,-0.82633666833981,0.990303978866558,TRUE,0.719584404671521,0.719584404671521,0.0933213318866302,0.187094263441849
481
+"Q9Z1N4",1,-1.23313661054892,0.677449504808424,-0.380199830355978,0.93588693609647,TRUE,0.719652983355991,0.719652983355991,0.102807360177441,0.177539656466569
482
+"P70623",2,0.405179407448735,-0.558298613544979,1.19736501886647,-1.04424581277022,TRUE,0.721004753427872,0.1105764496416,0.721004753427872,0.168418796930528
483
+"P07872",1,-1.1985775963355,0.122683699025297,-0.158324053333857,1.23421795064406,TRUE,0.721534046447055,0.721534046447055,0.110132149247758,0.168333804305187
484
+"Q9Z1H9",2,1.05993604832349,-0.653284728971853,0.623436696927137,-1.03008801627877,TRUE,0.722353356395497,0.100094145989918,0.722353356395497,0.177552497614585
485
+"P11240",1,-1.02659124692239,-0.0449593768298388,-0.291865521017455,1.36341614476968,TRUE,0.722876084230727,0.722876084230727,0.108468299892854,0.168655615876419
486
+"P10888",1,-0.675692051961226,0.0706804130712309,-0.782718809037126,1.38773044792712,TRUE,0.723647023355294,0.723647023355294,0.0983005613816692,0.178052415263036
487
+"P13697",1,-1.06056424115228,0.768376592709003,-0.641977901960249,0.934165550403522,TRUE,0.723904899920208,0.723904899920208,0.0954098603962989,0.180685239683493
488
+"Q9Z0W7",1,-0.67845705558116,0.081058873824372,-0.78635463795795,1.38375281971474,TRUE,0.726174929989588,0.726174929989588,0.0972429729750333,0.176582097035378
489
+"Q2PS20",1,-1.24349592392201,0.228326048394248,-0.158110249511984,1.17328012503974,TRUE,0.726685225575692,0.726685225575692,0.10735338280729,0.165961391617019
490
+"Q63797",2,0.515706069951749,-0.319354385828572,1.0447990119352,-1.24115069605838,TRUE,0.726849528926072,0.103701223149891,0.726849528926072,0.169449247924037
491
+"P27321",2,0.454757736352876,-0.412211456008723,1.12379716853757,-1.16634344888172,TRUE,0.727637215581746,0.105468371529907,0.727637215581746,0.166894412888347
492
+"P48037",2,0.692119996706304,-0.265489505468854,0.872842764207288,-1.29947325544474,TRUE,0.72905666663005,0.0992585012982008,0.72905666663005,0.171684832071749
493
+"P62919",1,-1.23244219332935,0.212335398496676,-0.166589411684196,1.18669620651687,TRUE,0.729438546502104,0.729438546502104,0.106225999378675,0.164335454119221
494
+"P18163",1,-0.958611485553349,0.739908154897204,-0.759464877062141,0.978168207718286,TRUE,0.729800269287764,0.729800269287764,0.0912210470071262,0.17897868370511
495
+"Q03344",1,-0.659696754311584,0.19869768463916,-0.869286660601423,1.33028573027385,TRUE,0.729840932476568,0.729840932476568,0.0933867844817794,0.176772283041652
496
+"Q63862",2,0.517652161163523,-0.748898584457472,1.15110611737193,-0.919859694077984,TRUE,0.730859114425251,0.106972396914232,0.730859114425251,0.162168488660518
497
+"Q5XFX0",2,0.559313372540016,-0.316198543774425,1.00929063514242,-1.25240546390801,TRUE,0.731950120880832,0.100996523606551,0.731950120880832,0.167053355512617
498
+"Q9Z0J5",1,-0.738642553359736,0.019681706008068,-0.68827132621593,1.4072321735676,TRUE,0.733710492450686,0.733710492450686,0.0968329205313432,0.169456587017971
499
+"P23928",1,-0.667348943380565,0.211324108857495,-0.868803014781052,1.32482784930412,TRUE,0.733711779446376,0.733711779446376,0.0919513183656726,0.174336902187951
500
+"P08503",1,-0.87626686802145,0.68111105824002,-0.83762293110798,1.03277874088941,TRUE,0.735700569202751,0.735700569202751,0.0881189398429944,0.176180490954255
501
+"P35738",2,1.01053313280792,-0.707693603981271,0.694788442906673,-0.99762797173332,TRUE,0.736075132836262,0.096590463941473,0.736075132836262,0.167334403222265
502
+"P10536",1,-1.24610295450899,0.280305504887791,-0.188768564048309,1.15456601366951,TRUE,0.737055938212803,0.737055938212803,0.102391516348361,0.160552545438836
503
+"Q3KR86",1,-1.01463515897453,0.735023183280667,-0.694209895016512,0.973821870710374,TRUE,0.73890398500887,0.73890398500887,0.0894509014542685,0.171645113536861
504
+"P02454",2,0.905031785827905,-0.829835769027947,0.825380219196657,-0.900576235996614,TRUE,0.740856542210073,0.0979098744513271,0.740856542210073,0.1612335833386
505
+"P41565",1,-1.26476488982974,0.42863404896448,-0.24037411133899,1.07650495220425,TRUE,0.741785204703604,0.741785204703604,0.098711275436716,0.15950351985968
506
+"O35077",1,-0.817883244179259,-0.0123322096863022,-0.581457891974591,1.41167334584015,TRUE,0.741968315662141,0.741968315662141,0.095896723780505,0.162134960557354
507
+"Q5U216",2,0.98097889447398,-0.536584435478646,0.686377020249097,-1.13077147924443,TRUE,0.742402041110294,0.092749861959037,0.742402041110294,0.164848096930669
508
+"P02650",2,0.859635355917474,-0.838417441438135,0.871960628912477,-0.893178543391817,TRUE,0.743900387111079,0.097545239899148,0.743900387111079,0.158554372989773
509
+"P05065",1,-1.07735498552758,0.722543094591348,-0.614519547442156,0.969331438378388,TRUE,0.744506943649326,0.744506943649326,0.0891088996122394,0.166384156738435
510
+"Q9EQP5",2,0.565080295586731,-0.720110165324766,1.11436315883433,-0.959333289096297,TRUE,0.744584171928576,0.100449867609949,0.744584171928576,0.154965960461476
511
+"P85125",2,0.952077877626545,-0.490741849132921,0.703758196550649,-1.16509422504427,TRUE,0.744661286791072,0.091871433020452,0.744661286791072,0.163467280188476
512
+"O35264",2,0.569482358705203,-0.707524707040695,1.10959091884696,-0.971548570511472,TRUE,0.74704228891154,0.0992765495768173,0.74704228891154,0.153681161511643
513
+"P21913",2,0.916646946907413,-0.459720418639509,0.731751447608624,-1.18867797587653,TRUE,0.748177778963228,0.0908146665821611,0.748177778963228,0.16100755445461
514
+"O70351",1,-1.13823671948862,0.692000516614328,-0.527211519807892,0.973447722682187,TRUE,0.748186089609027,0.748186089609027,0.0896095907390705,0.162204319651903
515
+"P45592",1,-1.13786951801662,0.115717552643501,-0.253602082848466,1.27575404822158,TRUE,0.749158328988649,0.749158328988649,0.0976623906885036,0.153179280322847
516
+"P86252",2,0.909273827400644,-0.457347136781224,0.738903442499646,-1.19083013311907,TRUE,0.749313774072297,0.09049356387781,0.749313774072297,0.160192662049893
517
+"P15429",2,0.891149985439135,-0.786802945464505,0.83702518561354,-0.941372225588171,TRUE,0.751101631028281,0.0937517216593751,0.751101631028281,0.155146647312344
518
+"Q9R063",1,-0.793046701978257,0.0413002784052446,-0.645598734183537,1.39734515775655,TRUE,0.752583262786608,0.752583262786608,0.0904976805153634,0.156919056698029
519
+"P49242",1,-1.24643486859391,0.402571478858155,-0.25934784118729,1.10321123092304,TRUE,0.753146968296868,0.753146968296868,0.0941990161281004,0.152654015575032
520
+"Q03626",2,0.955069258540878,-0.598864822802357,0.734521153346977,-1.0907255890855,TRUE,0.753231504400971,0.0899267329006161,0.753231504400971,0.156841762698413
521
+"P15999",1,-0.724107601596488,0.156337599403011,-0.78617232181351,1.35394232400699,TRUE,0.753405323637693,0.753405323637693,0.0869887422639036,0.159605934098403
522
+"O55171",1,-0.903023485685869,0.655863268295714,-0.804818477869452,1.05197869525961,TRUE,0.754364875237298,0.754364875237298,0.0826813204898574,0.162953804272845
523
+"P04764",1,-0.745678613374819,0.113171010050326,-0.739947598144616,1.37245520146911,TRUE,0.754909144974411,0.754909144974411,0.0875574746768979,0.157533380348691
524
+"P62907",1,-1.13878165567612,0.674041911984698,-0.522895752587309,0.987635496278727,TRUE,0.755300824463723,0.755300824463723,0.0872625545571286,0.157436620979148
525
+"D3Z9R8",1,-1.00486648641307,0.695434177564073,-0.699315599165439,1.00874790801444,TRUE,0.756601490729627,0.756601490729627,0.0835572813761928,0.159841227894181
526
+"P85834",1,-0.919394786963388,0.0124533169438206,-0.480147689610525,1.38708915963009,TRUE,0.758116242190021,0.758116242190021,0.0913039401440198,0.150579817665959
527
+"P61016",1,-0.870213552556973,0.0187279315425049,-0.543758029133742,1.39524365014821,TRUE,0.758234024675038,0.758234024675038,0.0902123680979095,0.151553607227053
528
+"P24090",2,0.921002879400943,-0.661826300703325,0.786968690429269,-1.04614526912689,TRUE,0.760275788003299,0.088524183808074,0.760275788003299,0.151200028188628
529
+"P53534",2,0.905235622782682,-0.552303696579053,0.775697001343731,-1.12862892754736,TRUE,0.761427556129113,0.0871729025089709,0.761427556129113,0.151399541361917
530
+"P02767",2,0.83127697537868,-0.468770525776114,0.824611408578162,-1.18711785818073,TRUE,0.763062495825032,0.0867894859148284,0.763062495825032,0.150148018260139
531
+"P34058",1,-0.880469794756418,0.616264641983705,-0.819235599602198,1.08344075237491,TRUE,0.763264102130625,0.763264102130625,0.0797031949698336,0.157032702899541
532
+"P13437",1,-0.957407010055961,0.663914884832136,-0.747546962355251,1.04103908757908,TRUE,0.76412034821393,0.76412034821393,0.0803446764522676,0.155534975333802
533
+"P12001",1,-0.741304427532002,0.367374120806414,-0.872655548572389,1.24658585529798,TRUE,0.764149457405838,0.764149457405838,0.0802325767614377,0.155617965832724
534
+"P16303",2,0.883516348871785,-0.542782776318995,0.795742947469058,-1.13647652002185,TRUE,0.764440529043085,0.086285999261183,0.764440529043085,0.149273471695732
535
+"Q64591",1,-0.759303594569315,0.42239534080674,-0.877558932695935,1.21446718645851,TRUE,0.765555993693378,0.765555993693378,0.0792770412191645,0.155166965087458
536
+"P05545",2,0.634244682656936,-0.563964427654486,1.03191379563016,-1.10219405063261,TRUE,0.766374263544739,0.0893348566046151,0.766374263544739,0.144290879850646
537
+"P19511",1,-0.770556842626532,0.147975799600781,-0.735261373389242,1.35784241641499,TRUE,0.769341369454815,0.769341369454815,0.0822255391714345,0.148433091373751
538
+"P67779",1,-1.0883086799354,0.661645853112395,-0.588787155859945,1.01544998268295,TRUE,0.770175480527316,0.770175480527316,0.0809453942971255,0.148879125175559
539
+"P05544",2,0.854783773442685,-0.63963521802757,0.850827266027975,-1.06597582144309,TRUE,0.770753184672689,0.0853427520362765,0.770753184672689,0.143904063291035
540
+"P57093",1,-0.882642589584684,0.056353645865472,-0.555460095647849,1.38174903936706,TRUE,0.771809144386861,0.771809144386861,0.0847108444786457,0.143480011134493
541
+"P10719",1,-0.786139691023282,0.449812982768322,-0.862150879344056,1.19847758759902,TRUE,0.773495179391016,0.773495179391016,0.0766588808279942,0.14984593978099
542
+"P35434",1,-1.04708951247394,0.124468688111093,-0.393820135095721,1.31644095945856,TRUE,0.784637231446537,0.784637231446537,0.0818040014551314,0.133558767098332
543
+"P04904",1,-0.93347486681692,0.600765691983322,-0.758944704393074,1.09165387922667,TRUE,0.785171395846791,0.785171395846791,0.0733763324060349,0.141452271747174
544
+"Q06647",1,-0.780303928520852,0.282452321514352,-0.796879712332893,1.29473131933939,TRUE,0.78621095559303,0.78621095559303,0.0744292869509328,0.139359757456037
545
+"Q6P0K8",1,-1.09670520689619,0.616617043561968,-0.566733083499606,1.04682124683382,TRUE,0.786764869293356,0.786764869293356,0.0756856990969332,0.137549431609711
546
+"P14668",1,-1.19001824400734,0.38551037015185,-0.343273350932101,1.14778122478759,TRUE,0.787186562837307,0.787186562837307,0.0800777651735092,0.132735671989184
547
+"P97852",1,-1.07780380960765,0.619952385548442,-0.592409793227392,1.0502612172866,TRUE,0.788383576664537,0.788383576664537,0.0747062863077041,0.136910137027759
548
+"P15650",1,-0.795880206848633,0.231616172526001,-0.755589451913106,1.31985348623574,TRUE,0.789754305718888,0.789754305718888,0.0741204204255642,0.136125273855548
549
+"Q68FY0",1,-1.07770605707768,0.168151034020481,-0.38087484271676,1.29042986577396,TRUE,0.79133797799866,0.79133797799866,0.0791826311416778,0.129479390859662
550
+"A1A5Q0",1,-1.15039305531266,0.294449607372259,-0.354196945170504,1.2101403931109,TRUE,0.796372198445662,0.796372198445662,0.0769447532227357,0.126683048331602
551
+"Q920F5",1,-1.17357998389218,0.448620496352072,-0.398659712037238,1.12361919957735,TRUE,0.796838027036941,0.796838027036941,0.0753553814894755,0.127806591473584
552
+"O89049",1,-0.817860182392178,0.385232243289297,-0.805722569409257,1.23835050851214,TRUE,0.79847863070038,0.79847863070038,0.0694113714101954,0.132109997889424
553
+"P00507",1,-0.988825868867648,0.135902190809088,-0.479080704227237,1.3320043822858,TRUE,0.799418067131879,0.799418067131879,0.0749977420644359,0.125584190803685
554
+"Q60587",1,-1.02967075227574,0.589227304659668,-0.644530873782009,1.08497432139808,TRUE,0.803116269911576,0.803116269911576,0.0689337294214224,0.127950000667002
555
+"Q01205",1,-1.1418561185172,0.30732882492016,-0.374410432636578,1.20893772623362,TRUE,0.80316084509107,0.80316084509107,0.0740455706339885,0.122793584274942
556
+"Q9ER34",1,-0.826115827202921,0.273788106989528,-0.746098277815338,1.29842599802873,TRUE,0.804813403738855,0.804813403738855,0.0686917053902994,0.126494890870845
557
+"P35565",1,-0.924063565928439,0.538126552980134,-0.750973401198032,1.13691041414634,TRUE,0.805393960253594,0.805393960253594,0.0669270629279877,0.127678976818419
558
+"P20788",1,-0.867043308597393,0.463158767971533,-0.786024959808923,1.18990950043478,TRUE,0.806498874281422,0.806498874281422,0.0664770763099769,0.127024049408601
559
+"P11442",1,-1.14678650384945,0.383625692534224,-0.407882966087002,1.17104377740222,TRUE,0.810232183974565,0.810232183974565,0.0705806408315778,0.119187175193857
560
+"P14408",1,-1.05472822852825,0.209921395148996,-0.439754364387074,1.28456119776633,TRUE,0.811964444719192,0.811964444719192,0.0704039553498334,0.117631599930975
561
+"Q5PPN7",1,-1.1399977600744,0.44750348420923,-0.447595282700421,1.14008955856559,TRUE,0.813089398409939,0.813089398409939,0.068704757378157,0.118205844211904
562
+"P07483",1,-0.941244361708913,0.175625021524125,-0.563268660790767,1.32888800097556,TRUE,0.813695461939065,0.813695461939065,0.0684070731227469,0.117897464938188
563
+"Q68FR6",1,-1.06320516670404,0.540783469003295,-0.587519319705086,1.10994101740583,TRUE,0.817763875687537,0.817763875687537,0.0647757879210043,0.117460336391459
564
+"Q641Z6",1,-1.05037119200368,0.23689913728425,-0.462093865616469,1.2755659203359,TRUE,0.821028885589133,0.821028885589133,0.0666104663273994,0.112360648083467
565
+"P11030",1,-0.87803698546107,0.271649583450281,-0.689631740679857,1.29601914269065,TRUE,0.822423417648515,0.822423417648515,0.0631939597667779,0.114382622584707
566
+"P61983",1,-1.03858003819239,0.5232515943483,-0.612616643880163,1.12794508772425,TRUE,0.825138557235193,0.825138557235193,0.0619277232706236,0.112933719494183
567
+"P48500",1,-0.927532600372658,0.467907896730675,-0.722846569651962,1.18247127329394,TRUE,0.826230784824065,0.826230784824065,0.0604562787842533,0.113312936391681
568
+"Q64428",1,-0.995014709681899,0.512494273654496,-0.66175760058014,1.14427803660754,TRUE,0.827387714218771,0.827387714218771,0.0605842610179938,0.112028024763235
569
+"P23965",1,-1.08508509529279,0.448995249361606,-0.52418083536045,1.16027068129164,TRUE,0.832717507282742,0.832717507282742,0.0606023008504485,0.10668019186681
570
+"Q5XIH7",1,-1.04514420128843,0.489647485054176,-0.592202973285894,1.14769968952015,TRUE,0.833255817830866,0.833255817830866,0.0594413509504134,0.10730283121872
571
+"Q62920",1,-1.08890601213291,0.414426871184063,-0.50391232109862,1.17839146204747,TRUE,0.834112449517675,0.834112449517675,0.0604790204250314,0.105408530057294
572
+"P35435",1,-1.06792226947819,0.326731224779647,-0.489086584808912,1.23027762950746,TRUE,0.835550457499105,0.835550457499105,0.0605051266383632,0.103944415862532
573
+"P13803",1,-0.975020115662053,0.452729931055493,-0.662970123758188,1.18526030836475,TRUE,0.839491507714856,0.839491507714856,0.0565871755613789,0.103921316723765
574
+"P48675",1,-0.939820758372308,0.338242965719301,-0.65351208291623,1.25508987556924,TRUE,0.842511927785957,0.842511927785957,0.0561320183500819,0.101356053863961
575
+"Q68FU3",1,-0.980730200900234,0.385564309938494,-0.627727061236256,1.222892952198,TRUE,0.847919834469016,0.847919834469016,0.0542717306497794,0.0978084348812046
0 576
new file mode 100644
... ...
@@ -0,0 +1,4 @@
1
+"","Mean of log A","Mean of log B","Mean of log C","Mean of log D"
2
+"Cluster 1",-0.82843252545034,0.315613804834518,-0.506719154265943,1.01953787488176
3
+"Cluster 2",0.564431811998367,-0.424850897609291,0.656792393952334,-0.79637330834141
4
+"Cluster 3",0.256381324798846,0.327727108498337,-0.504927054727596,-0.0791813785695871
0 5
new file mode 100644
... ...
@@ -0,0 +1,4 @@
1
+"","Mean of log A","Mean of log B","Mean of log C","Mean of log D"
2
+"Cluster 1",-0.828493878136864,0.315648120530924,-0.506601661828182,1.01944741943412
3
+"Cluster 2",0.564565846731013,-0.424563065072446,0.656658549520496,-0.796661331179062
4
+"Cluster 3",0.25605498413497,0.32744746777847,-0.505283649513114,-0.0782188024003263
0 5
new file mode 100644
... ...
@@ -0,0 +1,575 @@
1
+"","cluster","Mean.of.log.A","Mean.of.log.B","Mean.of.log.C","Mean.of.log.D","isClusterMember","maxMembership","membership.of.cluster.1","membership.of.cluster.2","membership.of.cluster.3"
2
+"Q9WTT7",1,-1.22255561673122,0.776823490992555,0.856334477189782,-0.410602351451118,FALSE,0.341407484594492,0.341407484594492,0.31967867010698,0.338913845298528
3
+"P63102",3,-1.09658973936807,0.830429584823418,0.865356334646909,-0.599196180102253,FALSE,0.343244348088085,0.319449740459528,0.337305911452386,0.343244348088085
4
+"Q7M0E3",1,-0.237751535202779,-1.30795600637204,0.634796914993558,0.910910626581266,FALSE,0.344396600714376,0.344396600714376,0.335658549724388,0.319944849561236
5
+"P62959",3,-1.11147501524251,0.921737797086268,0.764578478326509,-0.57484126017027,FALSE,0.348025559061792,0.326614714016126,0.325359726922082,0.348025559061792
6
+"P05765",3,-1.07423589883272,0.941039458988321,0.756377650063607,-0.623181210219205,FALSE,0.349682763565543,0.32125641628868,0.329060820145777,0.349682763565543
7
+"P02564",1,-1.29124213047911,0.407225819378061,1.06495216321144,-0.180935852110383,FALSE,0.350943974881038,0.350943974881038,0.325890928250797,0.323165096868165
8
+"P70567",3,-1.17907291834308,1.1033623798076,0.479167216325917,-0.403456677790437,FALSE,0.356530268091108,0.356277810327155,0.287191921581737,0.356530268091108
9
+"P62859",3,-1.11086660411474,1.10454447503702,0.52562489384656,-0.519302764768848,FALSE,0.35919913229563,0.340209940332181,0.300590927372189,0.35919913229563
10
+"P11960",3,0.768286653302108,-1.37327190516234,-0.110336827576684,0.715322079436916,FALSE,0.359400386844596,0.288066067011897,0.352533546143507,0.359400386844596
11
+"O35244",3,-0.942600836699279,1.07903247663846,0.616578229663232,-0.753009869602413,FALSE,0.361154589621232,0.309255526497047,0.32958988388172,0.361154589621232
12
+"P15865",3,0.845317841399481,-1.3509015407395,-0.155065561516922,0.660649260856937,FALSE,0.362415828846542,0.281620361802696,0.355963809350762,0.362415828846542
13
+"Q4V8H8",2,-0.990376331329471,-0.511646859134656,1.31196408053452,0.19005910992961,FALSE,0.36469277996539,0.330932563149224,0.36469277996539,0.304374656885386
14
+"Q641Y2",2,-0.658721981942087,1.04056760490572,0.648839467451583,-1.03068509041521,FALSE,0.365340726148357,0.274874676012736,0.365340726148357,0.359784597838908
15
+"Q00715",1,-0.975486617619047,-0.704959089890594,1.10433424359156,0.57611146391808,FALSE,0.366442880652395,0.366442880652395,0.328592276847621,0.304964842499983
16
+"Q5M9I5",1,-0.398721199682967,-1.20991980266353,0.600295332589979,1.00834566975651,FALSE,0.366704653997959,0.366704653997959,0.315524556311705,0.317770789690336
17
+"P18422",3,0.587017403091773,-1.26481732298012,-0.303727981502697,0.981527901391041,FALSE,0.367743028536912,0.322500643661561,0.309756327801527,0.367743028536912
18
+"P29410",1,0.283514062509728,-1.12256801478956,-0.389007210246928,1.22806116252676,FALSE,0.36897422959121,0.36897422959121,0.273474933272412,0.357550837136377
19
+"P09456",1,-1.34882690856007,0.633020500223665,0.869646113221733,-0.15383970488533,FALSE,0.369098378082535,0.369098378082535,0.301795556522666,0.329106065394799
20
+"A7VJC2",2,0.042521075344945,-1.4277086802381,0.677304391903939,0.707883212989214,FALSE,0.373870110815794,0.306593483347881,0.373870110815794,0.319536405836325
21
+"P10111",1,-1.36070277118647,0.662923511492294,0.831368872284789,-0.133589612590614,FALSE,0.374262644766891,0.374262644766891,0.296309261539601,0.329428093693508
22
+"P97584",1,0.273803667752207,-1.08041827100116,-0.442982941768729,1.24959754501768,FALSE,0.374521798886522,0.374521798886522,0.266904290021975,0.358573911091502
23
+"P18421",2,-0.440627912416783,1.08405540743566,0.521989827727627,-1.1654173227465,FALSE,0.375109221834207,0.257791476256323,0.375109221834207,0.36709930190947
24
+"Q04462",1,0.252472592963566,-1.08498771672392,-0.424134765760787,1.25664988952114,FALSE,0.376655895969699,0.376655895969699,0.266286760368138,0.357057343662163
25
+"Q66HF1",3,-0.662154669272374,1.21595063242532,0.404890207329366,-0.958686170482312,FALSE,0.378144699857235,0.285932418352255,0.335922881790509,0.378144699857235
26
+"P17074",3,-0.813618258900014,1.25221104136928,0.361139230622043,-0.799732013091312,FALSE,0.378558866742253,0.306178066626883,0.315263066630864,0.378558866742253
27
+"P84817",3,1.27805083523467,-1.07119723048097,-0.417853541909344,0.210999937155639,FALSE,0.379982422074746,0.243691000179082,0.376326577746172,0.379982422074746
28
+"P36953",2,-1.04471145516165,0.0369296695476287,1.34037224682916,-0.332590461215135,FALSE,0.382114345708453,0.305988435153691,0.382114345708453,0.311897219137856
29
+"P29147",3,0.95994417584446,-1.19225678544614,-0.445112954347543,0.677425563949227,FALSE,0.382589140234074,0.284331608025304,0.333079251740622,0.382589140234074
30
+"Q80W89",1,-1.38860650766364,0.62745796325888,0.821252679826623,-0.0601041354218674,FALSE,0.382657047490255,0.382657047490255,0.29081870460175,0.326524247907995
31
+"P49134",3,-0.967114563069212,1.36650763374215,0.0427791298065462,-0.442172200479485,FALSE,0.383085827377437,0.351546052281595,0.265368120340968,0.383085827377437
32
+"P52481",3,1.07812861879728,-1.17922044752121,-0.419543459353691,0.520635288077625,FALSE,0.384097441468735,0.26547565989141,0.350426898639855,0.384097441468735
33
+"P02262",3,0.577205983689815,-0.966365457057812,-0.715708269372901,1.1048677427409,FALSE,0.384771947843137,0.345934785599244,0.269293266557619,0.384771947843137
34
+"P31044",3,0.518125805339752,-0.885899999569846,-0.785416238181077,1.15319043241117,FALSE,0.385981024783071,0.357749472461743,0.256269502755186,0.385981024783071
35
+"P21670",3,0.806086873086992,-1.15745324851011,-0.513082652636684,0.864449028059801,FALSE,0.386000252590305,0.305471124042939,0.308528623366756,0.386000252590305
36
+"Q66HG9",3,0.528687527373817,-0.899407350936142,-0.774546156980346,1.14526598054267,FALSE,0.386844368557349,0.355982346711771,0.257173284730879,0.386844368557349
37
+"P11598",1,0.301084560576599,-0.913710960535612,-0.664980992069462,1.27760739202847,FALSE,0.38722237959586,0.38722237959586,0.245219534954078,0.367558085450061
38
+"P62755",3,-0.0389407975291494,1.13744489013407,0.192821775989106,-1.29132586859402,FALSE,0.387954445292219,0.237308922412941,0.37473663229484,0.387954445292219
39
+"Q5XIB3",1,-0.974203733132857,1.39661954883484,-0.285918554631725,-0.136497261070257,FALSE,0.390240158279033,0.390240158279033,0.229727458523139,0.380032383197828
40
+"Q561S0",2,-0.29195595563046,1.03974319256994,0.507611610559439,-1.25539884749892,FALSE,0.390533465615841,0.245506572484936,0.390533465615841,0.363959961899223
41
+"Q9Z327",3,1.4238473495347,-0.822864036512246,-0.540244687119878,-0.0607386259025733,FALSE,0.391657429329713,0.226004119353132,0.382338451317155,0.391657429329713
42
+"P21533",1,-1.1610071004706,1.27175679625698,0.064133344864941,-0.174883040651325,FALSE,0.39292879613967,0.39292879613967,0.244725179529153,0.362346024331177
43
+"P11661",3,1.01400127654449,-1.09525294190164,-0.579423152426748,0.660674817783897,FALSE,0.395193999522525,0.281925447405985,0.32288055307149,0.395193999522525
44
+"A0JPQ4",3,-0.798153063530559,1.41456579991769,-0.0149718595747129,-0.601440876812416,FALSE,0.395635149901412,0.327959233093593,0.276405617004995,0.395635149901412
45
+"P26453",1,-0.928217175921058,1.40351004597353,-0.404410893192759,-0.0708819768597153,FALSE,0.395827765613394,0.395827765613394,0.222421705299557,0.381750529087049
46
+"P50463",1,-0.927625902520372,1.40167652612515,-0.413732844484173,-0.0603177791206025,FALSE,0.396560624944578,0.396560624944578,0.222572804438402,0.380866570617019
47
+"Q642A4",1,-0.990567498090708,1.3838391627856,-0.311600831676004,-0.0816708330188833,FALSE,0.399371544521457,0.399371544521457,0.224012362039035,0.376616093439509
48
+"Q4V8F9",3,-0.735389850308153,1.42648327512408,-0.650130176291942,-0.0409632485239869,FALSE,0.400085623870081,0.384884638348568,0.215029737781351,0.400085623870081
49
+"P05197",3,-0.806680466134843,1.4533670266097,-0.441430446709359,-0.205256113765502,FALSE,0.400250473300881,0.371412052812128,0.228337473886991,0.400250473300881
50
+"P85968",3,-0.670588273110441,1.37506139632225,-0.805765134932413,0.101292011720603,FALSE,0.400689462299992,0.399120880431839,0.200189657268169,0.400689462299992
51
+"P63159",3,1.06262914289487,-1.01249703502632,-0.674840031796486,0.624707923927939,FALSE,0.401604174138911,0.280796541858477,0.317599284002612,0.401604174138911
52
+"P05503",1,-1.37323640326891,0.955518608862908,0.447565716305493,-0.0298479218994934,FALSE,0.402160047595408,0.402160047595408,0.262596248573835,0.335243703830757
53
+"P63031",3,1.49135080000615,-0.533609962008834,-0.606344815216201,-0.351396022781113,FALSE,0.402362543852188,0.208104581697927,0.389532874449885,0.402362543852188
54
+"P16290",1,0.276918870971871,-0.0851212638009298,-1.29957590901914,1.1077783018482,FALSE,0.402581623704849,0.402581623704849,0.196306646375785,0.401111729919366
55
+"Q8CG45",3,1.47145046115324,-0.624139144658676,-0.631400254984229,-0.21591106151033,FALSE,0.403361457126971,0.21842840528784,0.37821013758519,0.403361457126971
56
+"O08730",3,1.31416497032711,0.188825682305777,-0.519304842536431,-0.983685810096455,FALSE,0.404874330150405,0.193642474338931,0.401483195510665,0.404874330150405
57
+"O35567",1,-0.0794176151699813,-1.10234583661795,-0.144048226856943,1.32581167864488,FALSE,0.405622416737614,0.405622416737614,0.260680695934746,0.33369688732764
58
+"Q9Z2L0",3,0.657315623928304,-0.707989738599222,-0.990882103975011,1.04155621864593,FALSE,0.405984539087784,0.342548567920266,0.25146689299195,0.405984539087784
59
+"P69897",3,1.45289065868013,-0.680451397169984,-0.638967947908986,-0.133471313601158,FALSE,0.406584608514503,0.219290700825303,0.374124690660193,0.406584608514503
60
+"P84100",3,1.09399813885662,0.49619439153139,-0.412602437701228,-1.17759009268678,FALSE,0.407129688903555,0.191298631838792,0.401571679257653,0.407129688903555
61
+"Q63362",3,0.724123291047497,0.841146682965716,-0.261538704480694,-1.30373126953252,FALSE,0.407259520673545,0.206858404750147,0.385882074576308,0.407259520673545
62
+"Q5U2X7",3,0.483365463231436,-0.395542825484475,-1.18541193085588,1.09758929310892,FALSE,0.408025481614614,0.369844769260463,0.222129749124923,0.408025481614614
63
+"Q925F0",3,0.938465018048178,-0.908394733983895,-0.819289550219721,0.789219266155438,FALSE,0.408740205826458,0.300688041325475,0.290571752848067,0.408740205826458
64
+"A2RRU1",2,1.42513530027703,-0.891863820107753,-0.391893607115268,-0.141377873054013,FALSE,0.408958722631579,0.21677366553112,0.408958722631579,0.3742676118373
65
+"P97521",1,-1.22745452042076,1.21876589866509,0.0673019890263837,-0.0586133672707044,FALSE,0.409112528380872,0.409112528380872,0.239397380762313,0.351490090856815
66
+"A2VD12",1,0.216387517496557,-0.735341273088526,-0.807714097180547,1.32666785277252,FALSE,0.409280851125744,0.409280851125744,0.226707171033056,0.3640119778412
67
+"P29266",3,0.750866432895612,0.820549850273136,-0.271790358440313,-1.29962592472843,FALSE,0.409361501548084,0.202096934305588,0.388541564146329,0.409361501548084
68
+"P47727",1,0.278093614538014,-0.410099019281359,-1.10569905628898,1.23770446103232,FALSE,0.409465621485977,0.409465621485977,0.20664634193286,0.383888036581163
69
+"P35281",2,1.23436122770519,0.297701702767411,-0.438833020677535,-1.09322990979507,FALSE,0.409634614805847,0.192498170500417,0.409634614805847,0.397867214693736
70
+"P03889",3,0.719762247170447,0.855381381699331,-0.282732100463333,-1.29241152840645,FALSE,0.40996112306766,0.208749991093285,0.381288885839055,0.40996112306766
71
+"P30427",1,-0.0997799682730416,-1.09555903734175,-0.135602849207248,1.33094185482204,FALSE,0.410078632098041,0.410078632098041,0.257706515137615,0.332214852764344
72
+"P62832",2,0.868105928023184,0.677624501556055,-0.228541849427491,-1.31718858015175,FALSE,0.410679490335731,0.195644009201772,0.410679490335731,0.393676500462497
73
+"Q920L2",2,0.849139095726594,-1.44475511332672,0.213350213381282,0.382265804218844,FALSE,0.410730715413483,0.254313411815072,0.410730715413483,0.334955872771446
74
+"P52504",2,0.517196670869277,0.871657068685931,0.0155957366629745,-1.40444947621818,FALSE,0.410743475738675,0.208472168627432,0.410743475738675,0.380784355633893
75
+"Q5BK63",2,-0.455949953851938,0.853808422374985,0.797056492788871,-1.19491496131192,FALSE,0.411377281673451,0.246523235237803,0.411377281673451,0.342099483088747
76
+"Q5XIF3",3,-0.686652950476595,1.46861271027439,-0.209384312977792,-0.572575446820001,FALSE,0.411925073092204,0.325154730686414,0.262920196221382,0.411925073092204
77
+"P0C1X8",2,1.26156448337688,0.258704159268722,-0.455241849003986,-1.06502679364161,FALSE,0.411937982154027,0.187436758704045,0.411937982154027,0.400625259141928
78
+"P04041",2,-0.89616725763667,0.114745832657532,1.359836070356,-0.578414645376864,FALSE,0.41302521988152,0.278725802378883,0.41302521988152,0.308248977739597
79
+"Q505J9",1,0.219255643045472,-0.0307072213378385,-1.30530863973811,1.11676021803047,FALSE,0.413088557054481,0.413088557054481,0.191227534437265,0.395683908508255
80
+"P62246",2,0.484040352017557,0.884437145960691,0.0393324435093142,-1.40780994148756,FALSE,0.414010887737458,0.204761407525969,0.414010887737458,0.381227704736574
81
+"Q5XI32",3,0.651412122615601,0.920285644805855,-0.289049305200988,-1.28264846222047,FALSE,0.414984471161395,0.212117378653525,0.372898150185081,0.414984471161395
82
+"P24473",3,0.152635238138068,0.345977209942306,-1.41821491756349,0.919602469483118,FALSE,0.415187856702385,0.403307487693099,0.181504655604517,0.415187856702385
83
+"P04642",2,0.20410079310017,0.947278036467618,0.260423790258789,-1.41180261982658,FALSE,0.415203903816036,0.216343691805753,0.415203903816036,0.368452404378211
84
+"P28042",3,-0.345496218280398,1.13256573262833,-1.19608943263915,0.409019918291224,FALSE,0.416749707953033,0.407336319638553,0.175913972408414,0.416749707953033
85
+"P11980",3,0.372565811413721,-0.0700343380101918,-1.3367038965113,1.03417242310777,FALSE,0.41718224582677,0.3824123922454,0.20040536192783,0.41718224582677
86
+"P07895",3,0.186338549751249,0.306350378860213,-1.41896038609356,0.9262714574821,FALSE,0.417549651270342,0.398799959626099,0.183650389103559,0.417549651270342
87
+"Q63617",2,0.222054472732967,0.927367280055935,0.27089439680599,-1.42031614959489,FALSE,0.418530800648855,0.215716235597631,0.418530800648855,0.365752963753514
88
+"O88989",3,1.31147261726968,-0.789297075492299,-0.771340675121424,0.249165133344046,FALSE,0.418550924480194,0.24802367882338,0.333425396696426,0.418550924480194
89
+"P20070",2,-0.191187100684764,-1.26027754640786,1.12683903482903,0.324625612263595,FALSE,0.418912296707115,0.281154382360707,0.418912296707115,0.299933320932177
90
+"P11951",1,-1.3338251265102,1.07618450897424,0.250368839470242,0.00727177806572177,FALSE,0.419434126996818,0.419434126996818,0.242097507566092,0.33846836543709
91
+"O35094",3,-0.559064156125634,1.47833051977834,-0.260308296330563,-0.658958067322138,FALSE,0.420256139202146,0.310689052952847,0.269054807845007,0.420256139202146
92
+"P19234",2,-0.238156280128961,0.891942444475275,0.656469030080836,-1.31025519442715,FALSE,0.420352840288236,0.233195514625576,0.420352840288236,0.346451645086188
93
+"P31211",2,-0.827431958207961,-0.314874259283705,1.45539821280822,-0.313091995316558,FALSE,0.420652453542478,0.280964798268499,0.420652453542478,0.298382748189024
94
+"P19945",1,-0.828327352557475,-0.880047244076799,0.654038898391862,1.05433569824241,FALSE,0.42070732890641,0.42070732890641,0.277516309539092,0.301776361554499
95
+"P12368",2,1.29099592677473,0.180253377604296,-0.405056218203893,-1.06619308617513,FALSE,0.422161061259554,0.190708089180229,0.422161061259554,0.387130849560217
96
+"Q99J82",3,1.09036734729641,0.544325182035761,-0.518432137010402,-1.11626039232177,FALSE,0.423330507896498,0.197511000502443,0.37915849160106,0.423330507896498
97
+"P84245",2,-0.406534605662114,-1.06526978216782,1.29125155584021,0.180552831989725,FALSE,0.423340587425306,0.281263073025991,0.423340587425306,0.295396339548703
98
+"P17764",1,-0.135198790129031,0.794532316434377,-1.36240083730583,0.703067311000481,FALSE,0.42334658447666,0.42334658447666,0.165138914291713,0.411514501231628
99
+"Q6P6V0",3,-0.519741286507428,1.40312411993121,-0.872347360577147,-0.0110354728466381,FALSE,0.42409938422137,0.369578593623372,0.206322022155258,0.42409938422137
100
+"P60901",2,0.999758449581309,0.532449670126365,-0.244975702237386,-1.28723241747029,FALSE,0.424616765766727,0.189412205702555,0.424616765766727,0.385971028530717
101
+"P26284",3,-0.552048731231546,1.4596723736184,-0.730134478544469,-0.177489163842383,FALSE,0.424982862253099,0.354069921061401,0.220947216685501,0.424982862253099
102
+"P02770",2,-0.676270590076743,-0.684859536878106,1.43795792471005,-0.0768277977552051,FALSE,0.425456538406848,0.280816510573153,0.425456538406848,0.293726951019999
103
+"P47942",2,0.0244119384073626,-1.37315030453493,0.9939898240482,0.354748542079372,FALSE,0.425469406834083,0.272535004242539,0.425469406834083,0.301995588923377
104
+"Q64536",1,-1.24867078177144,1.19984543131461,0.0247748078984623,0.0240505425583701,FALSE,0.425659891342067,0.425659891342067,0.228455123610822,0.345884985047111
105
+"Q9ER30",3,0.82354919357449,0.822758894481269,-0.442582521895795,-1.20372556615996,FALSE,0.425910043215124,0.209838907010292,0.364251049774584,0.425910043215124
106
+"Q63638",3,0.615481757279154,-0.424605848803438,-1.19604580297424,1.00516989449853,FALSE,0.426242681829363,0.348648027186283,0.225109290984354,0.426242681829363
107
+"P63255",2,-0.507323103447376,0.693138730723931,0.966553899924051,-1.15236952720061,FALSE,0.426687000636394,0.245164208033076,0.426687000636394,0.32814879133053
108
+"P68136",1,-0.723198133334644,1.31414364868263,-0.831850716539498,0.240905201191517,FALSE,0.427016143505864,0.427016143505864,0.189132947864805,0.383850908629331
109
+"Q68FQ0",3,1.44245405902461,-0.10230459762413,-0.743762475483122,-0.596386985917363,FALSE,0.427434528816498,0.205870825315652,0.366694645867849,0.427434528816498
110
+"Q63159",2,-0.130838896665075,-1.27672199487876,1.12936727546149,0.278193616082341,FALSE,0.427747532283011,0.274116875605852,0.427747532283011,0.298135592111137
111
+"Q5BK81",1,-0.254565008206742,0.937158477241225,-1.29627414868664,0.613680679652157,FALSE,0.427956653767154,0.427956653767154,0.166248629879719,0.405794716353127
112
+"P62909",3,-0.503572307087162,1.49330088180059,-0.379352205420729,-0.610376369292696,FALSE,0.428517723154314,0.311317844967914,0.260164431877772,0.428517723154314
113
+"P85972",3,-0.131208127839539,1.38375864101433,-0.249741687977783,-1.00280882519701,FALSE,0.428543806774538,0.265268834898519,0.306187358326943,0.428543806774538
114
+"Q8VBU2",3,1.28786954342104,-0.705845774941151,-0.871441874673088,0.289418106193196,FALSE,0.428925490434918,0.252684353704052,0.31839015586103,0.428925490434918
115
+"B2RYW9",3,1.46113771367313,-0.228345988802215,-0.779256190055297,-0.453535534815621,FALSE,0.429387936494383,0.210695035911472,0.359917027594145,0.429387936494383
116
+"P62278",3,1.2816891397975,0.29733937581988,-0.684165508538103,-0.894863007079282,FALSE,0.429854950372141,0.204762909891778,0.365382139736082,0.429854950372141
117
+"Q9NQR8",3,-0.10744274387748,0.959313640238656,-1.34933443681078,0.497463540449608,FALSE,0.431055038730574,0.383478517702225,0.185466443567201,0.431055038730574
118
+"P07633",1,-0.123189043717616,-0.958574743351368,-0.319598343138577,1.40136213020756,FALSE,0.43169810323552,0.43169810323552,0.238240483282924,0.330061413481557
119
+"Q09073",3,-0.354854418232648,1.30594113195523,-1.07400519073979,0.122918477017206,FALSE,0.432324976345308,0.367270118583766,0.200404905070926,0.432324976345308
120
+"Q6AXS5",2,-0.0734213683397524,0.875268942905072,0.57555811573419,-1.37740569029951,FALSE,0.432903081948736,0.220658646332521,0.432903081948736,0.346438271718743
121
+"O35854",2,0.56501459940382,-1.48672793406183,0.611887817919841,0.30982551673817,FALSE,0.434207533780172,0.253225810275711,0.434207533780172,0.312566655944118
122
+"P36972",2,1.3113962630322,0.117479672727169,-0.36401312008419,-1.06486281567518,FALSE,0.434676778539338,0.186466620509629,0.434676778539338,0.378856600951033
123
+"P09812",2,0.521983767702376,0.793565524030845,0.127225906946887,-1.44277519868011,FALSE,0.434884190046972,0.200101399521037,0.434884190046972,0.365014410431991
124
+"Q5I0G4",3,-0.462478175903775,1.45957722939435,-0.780192019109558,-0.216907034381021,FALSE,0.435585920074623,0.342534322417972,0.221879757507405,0.435585920074623
125
+"Q9QZ76",1,0.136490781795837,-0.389930970855571,-1.05590582682842,1.30934601588815,FALSE,0.435912205977652,0.435912205977652,0.199865440893197,0.364222353129151
126
+"Q3T1J1",2,0.133852908035827,-1.39670067734223,0.973416847081542,0.289430922224862,FALSE,0.436300949039485,0.263342023169762,0.436300949039485,0.300357027790753
127
+"Q8CFN2",3,1.31692765310314,0.236327759687733,-0.734499581519243,-0.818755831271628,FALSE,0.436477210073171,0.203979547511172,0.359543242415658,0.436477210073171
128
+"P01048",2,-0.234854167949298,-1.16404835271534,1.25233950454475,0.146563016119883,FALSE,0.436618364057198,0.269714589078291,0.436618364057198,0.293667046864511
129
+"P14942",2,0.336376881504514,-1.46055795663105,0.808798364835442,0.31538271029109,FALSE,0.43705436710773,0.257878238694327,0.43705436710773,0.305067394197943
130
+"P70615",2,-0.640979130536403,0.432830626234847,1.19497766292747,-0.986829158625919,FALSE,0.437446265193784,0.249533179755168,0.437446265193784,0.313020555051049
131
+"P07632",2,0.856061508446359,0.604419080876901,-0.0839684894072711,-1.37651209991599,FALSE,0.437736840821241,0.191664597584341,0.437736840821241,0.370598561594418
132
+"O35987",3,1.23078203578623,-0.590533116303904,-1.00257844334928,0.362329523866952,FALSE,0.43781284513411,0.263178573659196,0.299008581206694,0.43781284513411
133
+"P28023",2,1.38354195947944,-1.00752242593757,-0.190735825292979,-0.185283708248888,FALSE,0.438338138034557,0.211173945891532,0.438338138034557,0.350487916073911
134
+"P50503",2,0.395563731917972,0.818380032248664,0.240658262947011,-1.45460202711365,FALSE,0.438411107858086,0.203539946670312,0.438411107858086,0.358048945471602
135
+"Q63377",2,0.694862044662732,0.705903448302105,0.0199626836487842,-1.42072817661362,FALSE,0.438696025920529,0.193542932560931,0.438696025920529,0.36776104151854
136
+"Q68FR9",3,0.90059753273327,0.785676656182459,-0.569389075412065,-1.11688511350366,FALSE,0.439279264263337,0.210506585674229,0.350214150062435,0.439279264263337
137
+"Q9Z270",3,1.30913657253346,-0.557502829597966,-0.964406451602326,0.212772708666834,FALSE,0.4392857026502,0.250246742535254,0.310467554814546,0.4392857026502
138
+"Q9R1Z0",3,0.788607483780401,-0.403282914781419,-1.22736601393943,0.842041444940444,FALSE,0.439448556150679,0.320526115931926,0.240025327917395,0.439448556150679
139
+"P97700",3,-0.426712462367446,1.42728412175252,-0.874588305954145,-0.12598335343093,FALSE,0.440088831495874,0.348207605032953,0.211703563471173,0.440088831495874
140
+"P51650",1,-1.4585861305481,0.762822450486972,0.50374212932785,0.192021550733279,FALSE,0.440135310126016,0.440135310126016,0.243068537589074,0.316796152284911
141
+"P04692",3,0.524222962694514,-0.0673417395369392,-1.3721812179802,0.915299994822626,FALSE,0.440325217448323,0.352836268468277,0.2068385140834,0.440325217448323
142
+"Q63416",2,-0.28212840642109,-1.1120391858465,1.29370795495053,0.100459637317061,FALSE,0.440732394273511,0.267683380899418,0.440732394273511,0.29158422482707
143
+"P16617",3,1.44150893865508,-0.227663629122814,-0.865293545169259,-0.348551764363002,FALSE,0.440907176485127,0.216332328419501,0.342760495095372,0.440907176485127
144
+"B1PRL5",1,-0.598624199641864,1.2168847923014,-1.00544825159549,0.387187658935953,FALSE,0.440912221625548,0.440912221625548,0.173643723613603,0.385444054760849
145
+"Q71LX6",3,1.38185932450224,-0.421500227695758,-0.955394009425395,-0.00496508738108957,FALSE,0.441504138920468,0.237942403922811,0.32055345715672,0.441504138920468
146
+"Q63355",3,1.39227254303094,-0.458228086993823,-0.922754969482947,-0.0112894865541733,FALSE,0.44154786530477,0.233493639984973,0.324958494710256,0.44154786530477
147
+"P08050",1,-0.978378067259696,1.31207002382211,-0.531245106405444,0.197553149843033,FALSE,0.442119627201951,0.442119627201951,0.198983074755019,0.35889729804303
148
+"P97576",3,-0.41524343848193,1.45575237198778,-0.809242786496914,-0.231266147008938,FALSE,0.442175384839098,0.337018764916801,0.220805850244101,0.442175384839098
149
+"P43278",1,-0.963887213220377,-0.728990950287461,0.615597798240325,1.07728036526751,FALSE,0.442599936347869,0.442599936347869,0.26157714649901,0.295822917153121
150
+"P63088",3,0.934382364507242,0.756314980122834,-0.594661125585992,-1.09603621904408,FALSE,0.442623353280799,0.208223494850111,0.34915315186909,0.442623353280799
151
+"Q5XIE6",3,-0.0131078844840037,0.86943634098686,-1.39699326880179,0.540664812298929,FALSE,0.443143275721919,0.378148335540167,0.178708388737915,0.443143275721919
152
+"P0C219",1,-1.13701153338653,1.27059721987052,-0.271566999309857,0.137981312825867,FALSE,0.443221276532232,0.443221276532232,0.208295557913082,0.348483165554686
153
+"P16086",3,0.619749276032991,1.02406388373118,-0.493164169485221,-1.15064899027895,FALSE,0.443804499171331,0.219848181042107,0.336347319786562,0.443804499171331
154
+"P02091",2,0.338914789154833,-1.45270270342468,0.834859658407572,0.278928255862271,FALSE,0.444005604368192,0.25368661154929,0.444005604368192,0.302307784082518
155
+"P22062",3,1.14657519362804,-0.53258482332431,-1.08584903662484,0.471858666321115,FALSE,0.444676379087722,0.273073233421546,0.282250387490732,0.444676379087722
156
+"P00564",1,0.0697923341499883,-0.5303866931005,-0.911575274901173,1.37216963385168,FALSE,0.444807360630885,0.444807360630885,0.203961275589571,0.351231363779544
157
+"P09605",1,-0.323820337210932,-0.93316928265902,-0.157101787206282,1.41409140707623,FALSE,0.444898537984278,0.444898537984278,0.238478910483545,0.316622551532177
158
+"Q9WU82",3,0.997586224122385,0.697510786382722,-0.645529334368543,-1.04956767613656,FALSE,0.446054959881047,0.207572064377646,0.346372975741307,0.446054959881047
159
+"P51868",2,-0.723653157350259,-0.0748389075157923,1.43653347016468,-0.638041405298633,FALSE,0.447009305657762,0.257097557186732,0.447009305657762,0.295893137155506
160
+"P09650",2,0.155209512015489,-1.39151144105516,0.989220154105079,0.247081774934592,FALSE,0.447310677499943,0.256073161289054,0.447310677499943,0.296616161211004
161
+"Q9JK11",3,1.2227388271462,-0.511854447958883,-1.05908857962475,0.348204200437434,FALSE,0.447800225391665,0.261174668256489,0.291025106351846,0.447800225391665
162
+"O35763",2,0.931859432282319,0.526071491956477,-0.0996382444133528,-1.35829267982544,FALSE,0.449642321291571,0.183212233083595,0.449642321291571,0.367145445624834
163
+"P47967",2,-0.262263297400804,-1.08312695573393,1.32577111524864,0.0196191378860915,FALSE,0.449842180508187,0.261256652132798,0.449842180508187,0.288901167359015
164
+"P62961",2,-0.0420608702286597,0.769181843032893,0.671388237206508,-1.39850921001074,FALSE,0.44986893447797,0.217212889808861,0.44986893447797,0.332918175713169
165
+"Q6P502",3,-0.199521122275059,1.19863077330491,-1.21522428261858,0.216114631588723,FALSE,0.450627663648259,0.361302780118747,0.188069556232994,0.450627663648259
166
+"Q64119",2,-0.554223089772288,-0.665148226006098,1.47772407908167,-0.25835276330328,FALSE,0.451989614129709,0.260614407155264,0.451989614129709,0.287395978715027
167
+"B2GV06",1,-1.18192824376596,-0.462874308116883,0.688041155121545,0.956761396761301,FALSE,0.453339284382168,0.453339284382168,0.255175816581875,0.291484899035957
168
+"P24329",3,1.3958620723858,0.00698201191704674,-0.885180802422439,-0.517663281880403,FALSE,0.454704323945554,0.207589851393007,0.337705824661439,0.454704323945554
169
+"P49432",1,-0.94148888357518,1.286659476516,-0.618979015333235,0.273808422392411,FALSE,0.455893242536246,0.455893242536246,0.188748400730621,0.355358356733133
170
+"P18420",2,-0.49823678514149,0.469226792514345,1.1394862257753,-1.11047623314816,FALSE,0.455905828833442,0.234252588535076,0.455905828833442,0.309841582631482
171
+"Q9EPX0",3,0.733756168975377,0.968231710595509,-0.656381674004518,-1.04560620556637,FALSE,0.456492382822012,0.221842359251218,0.32166525792677,0.456492382822012
172
+"P00388",3,0.514969083728862,0.229720745753188,-1.4688743832705,0.724184553788447,FALSE,0.457527437723568,0.336190730564244,0.206281831712189,0.457527437723568
173
+"Q497B0",1,-1.49634960166187,0.546496270632869,0.549656246529284,0.400197084499716,FALSE,0.45774712589759,0.45774712589759,0.238990820688599,0.303262053413811
174
+"P02563",1,-0.0268127992003775,-0.583794186585127,-0.806461989563737,1.41706897534924,FALSE,0.457756990312432,0.457756990312432,0.204095647643688,0.338147362043879
175
+"P27605",1,-1.00863580265014,1.28602590868172,-0.51969278552188,0.242302679490303,FALSE,0.457806949051671,0.457806949051671,0.19070973591883,0.351483315029499
176
+"Q6AY30",3,0.202489343231166,0.638563536443384,-1.46875105856131,0.627698178886762,FALSE,0.458240244637543,0.360543674124863,0.181216081237594,0.458240244637543
177
+"P62425",3,-0.191363535544085,1.24601246613443,-1.18104105071426,0.126392120123924,FALSE,0.45854135548544,0.350072417155405,0.191386227359154,0.45854135548544
178
+"P24368",1,-1.4430022988271,0.864617951322675,0.327375528183355,0.251008819321069,FALSE,0.458805330224791,0.458805330224791,0.226742633991998,0.314452035783211
179
+"Q4FZT0",3,-0.101062880755208,1.14380902298892,-1.27563676986251,0.2328906276288,FALSE,0.45885918806551,0.351480798583688,0.189660013350802,0.45885918806551
180
+"Q641Z4",3,0.293785731801982,1.26947900729869,-0.58136420987469,-0.981900529225986,FALSE,0.459631052104313,0.243623962214536,0.296744985681151,0.459631052104313
181
+"P62902",2,0.401115764156966,0.729811617110601,0.347493804659624,-1.47842118592719,FALSE,0.45974182764564,0.198390990530107,0.45974182764564,0.341867181824252
182
+"Q62871",3,0.962484821604179,-0.297392334120914,-1.27169659361495,0.606604106131684,FALSE,0.459772578593163,0.291415979711411,0.248811441695427,0.459772578593163
183
+"P0C546",3,-0.0795023719852119,1.43858518905403,-0.696847113623465,-0.66223570344535,FALSE,0.460654649478478,0.281677877197856,0.257667473323666,0.460654649478478
184
+"P62804",1,-0.504603414100624,-0.897247365161814,0.00892475504739636,1.39292602421504,FALSE,0.461455237694958,0.461455237694958,0.233950655499141,0.3045941068059
185
+"P04897",2,0.543085071588938,0.686756616838447,0.24448844854177,-1.47433013696915,FALSE,0.461703081807427,0.193239620557926,0.461703081807427,0.345057297634646
186
+"P80299",1,-0.402198266828379,0.94945407749547,-1.21888687718545,0.671631066518356,FALSE,0.461763759488092,0.461763759488092,0.163442299060519,0.374793941451388
187
+"P14669",3,0.813613811530261,0.898666695863747,-0.676587382052196,-1.03569312534181,FALSE,0.462270667376749,0.213607398879653,0.324121933743598,0.462270667376749
188
+"P63324",2,0.778820786981544,0.585460238589606,0.0662053739637651,-1.43048639953492,FALSE,0.462672512813676,0.184948575503496,0.462672512813676,0.352378911682828
189
+"Q5RKI1",3,0.970571046673791,-0.255144250833634,-1.28964030077299,0.57421350493283,FALSE,0.462951176036879,0.288916905340421,0.2481319186227,0.462951176036879
190
+"Q9EP80",1,-1.47768015573614,0.254113142835235,0.652586389022513,0.570980623878396,FALSE,0.464124334747701,0.464124334747701,0.241462791062379,0.29441287418992
191
+"P52296",3,1.06900658844428,-0.249744808240528,-1.26381398299482,0.444552202791067,FALSE,0.465575116803409,0.275694443590053,0.258730439606539,0.465575116803409
192
+"P39069",3,1.36375565813091,-0.0142224239084874,-1.01340230072908,-0.336130933493338,FALSE,0.465779985375598,0.220267858121714,0.313952156502688,0.465779985375598
193
+"P97519",3,0.530300241364083,0.253968638566871,-1.47535711943162,0.691088239500664,FALSE,0.46586967217458,0.330990123475334,0.203140204350086,0.46586967217458
194
+"Q4V8C3",1,-0.237881180454806,-0.764413941803177,-0.462383993494748,1.46467911575273,FALSE,0.465973481528796,0.465973481528796,0.216151298263225,0.317875220207979
195
+"P12749",3,0.956313917933676,0.769484222618582,-0.817247616079122,-0.908550524473136,FALSE,0.466274128298377,0.218118831887866,0.315607039813757,0.466274128298377
196
+"P01835",3,0.7931401985088,-0.098169091674018,-1.37699976781216,0.682028660977373,FALSE,0.466615843314406,0.307578125713872,0.225806030971723,0.466615843314406
197
+"P05708",3,0.663934423173226,0.102686383812382,-1.44509966164471,0.6784788546591,FALSE,0.467027008275007,0.318263550800719,0.214709440924274,0.467027008275007
198
+"P06685",3,1.23837068282774,-0.29885241435084,-1.15378325587032,0.214264987393416,FALSE,0.467368306004224,0.251477823275177,0.281153870720599,0.467368306004224
199
+"Q5M7W5",3,-0.119111695683569,1.43152243122662,-0.850299370077205,-0.46211136546585,FALSE,0.467484405706158,0.295464702598518,0.237050891695324,0.467484405706158
200
+"P82995",2,0.227873108522762,0.709255224846857,0.532916266433469,-1.47004459980309,FALSE,0.469191259930162,0.201084270801735,0.469191259930162,0.329724469268103
201
+"P08461",3,-0.100312481450952,1.30220859596137,-1.13569708419768,-0.0661990303127416,FALSE,0.469724192112254,0.322608872520091,0.207666935367656,0.469724192112254
202
+"B2RZ37",1,-0.768871365806504,1.22016864286676,-0.865254255166871,0.413956978106619,FALSE,0.469756848981309,0.469756848981309,0.171193112303483,0.359050038715208
203
+"Q63258",3,-0.022590897976474,1.41878602133826,-0.775089333105415,-0.621105790256365,FALSE,0.470093587767089,0.278947797126056,0.250958615106856,0.470093587767089
204
+"Q07803",3,0.581068542455019,0.245833264796872,-1.47647537546803,0.64957356821614,FALSE,0.470966113572767,0.322460466253548,0.206573420173685,0.470966113572767
205
+"P04797",1,-0.0350871227090812,-0.394646204325311,-0.957883928264705,1.3876172552991,FALSE,0.471525995820968,0.471525995820968,0.18986542933091,0.338608574848122
206
+"Q5SGE0",3,0.634521771705035,1.06257116815456,-0.729671723708569,-0.967421216151024,FALSE,0.47174249707914,0.226379928842021,0.301877574078839,0.47174249707914
207
+"P41350",2,0.912081265139484,0.475559919216882,0.00588523913774426,-1.39352642349411,FALSE,0.472103794485322,0.178200891308288,0.472103794485322,0.34969531420639
208
+"Q5XI78",1,-1.33718615888379,1.06819085482938,0.00273605415657945,0.266259249897831,FALSE,0.472180571768541,0.472180571768541,0.207824162808174,0.319995265423286
209
+"P18292",2,0.21592647509952,0.699674793030934,0.553304726480143,-1.4689059946106,FALSE,0.472423928108809,0.1999330347988,0.472423928108809,0.327643037092391
210
+"P29975",2,1.10918964351926,0.277930085793798,-0.0892409793006588,-1.2978787500124,FALSE,0.472918107902399,0.179477095077985,0.472918107902399,0.347604797019615
211
+"P21807",2,1.00755050479956,-1.36243020192858,0.358625009979302,-0.00374531285027488,FALSE,0.473118944377374,0.217111101128672,0.473118944377374,0.309769954493955
212
+"P35745",3,0.245427297553332,0.772124161305991,-1.46425577512131,0.446704316261984,FALSE,0.473672823682597,0.335278886162363,0.191048290155041,0.473672823682597
213
+"Q62812",1,-0.573863282897392,-0.849657553892745,0.0278170043367933,1.39570383245334,FALSE,0.47367679691834,0.47367679691834,0.227611152714804,0.298712050366856
214
+"P10760",3,0.672820866833128,1.03756531575136,-0.791711401350385,-0.918674781234098,FALSE,0.475642106880454,0.227752769559549,0.296605123559997,0.475642106880454
215
+"Q6AYH5",2,1.26295495769411,0.0660884198564188,-0.155896607850569,-1.17314676969996,FALSE,0.476617653418058,0.178263207934315,0.476617653418058,0.345119138647626
216
+"Q9WUH4",3,-0.0336824751812279,1.34252933362082,-1.06669787046599,-0.242148987973597,FALSE,0.478990801446054,0.302805452516466,0.21820374603748,0.478990801446054
217
+"Q9Z269",3,0.591584816793317,1.10202872335531,-0.82038059221885,-0.873232947929777,FALSE,0.479550716696554,0.23351034656629,0.286938936737156,0.479550716696554
218
+"Q5XIJ4",3,-0.0599735127030101,1.36722739659608,-1.0228396619972,-0.284414221895869,FALSE,0.47955720485861,0.301175127012458,0.219267668128932,0.47955720485861
219
+"P52944",1,-1.44365824616963,0.102084773359653,0.618251625094375,0.7233218477156,FALSE,0.479855577004127,0.479855577004127,0.233621758803743,0.28652266419213
220
+"Q6P9T8",1,-0.0705650788581804,-0.369115111915813,-0.95534398992083,1.39502418069482,FALSE,0.480473682642204,0.480473682642204,0.186093550461317,0.333432766896479
221
+"Q9Z0V6",3,0.156915544469417,0.910384966932221,-1.42162872758755,0.354328216185911,FALSE,0.480922677437015,0.334272912688492,0.184804409874493,0.480922677437015
222
+"Q63569",2,1.08833269661863,-1.31313750315304,0.293969524138996,-0.0691647176045851,FALSE,0.480986023305436,0.209171360244969,0.480986023305436,0.309842616449595
223
+"Q75Q39",3,0.65187587361257,0.275583114885024,-1.48083856030799,0.553379571810401,FALSE,0.481377163701721,0.307932180429511,0.210690655868767,0.481377163701721
224
+"P07943",1,-0.125686974479761,0.357383505041906,-1.30530994470434,1.07361341414219,FALSE,0.481793820313215,0.481793820313215,0.159395585687755,0.35881059399903
225
+"P17475",2,-0.188431950503736,-1.02019779232277,1.37674510675709,-0.168115363930579,FALSE,0.481845029451595,0.240310993311711,0.481845029451595,0.277843977236694
226
+"P61589",2,0.712226854361772,0.554183540177929,0.198574782058425,-1.46498517659813,FALSE,0.482079244801759,0.182119138585664,0.482079244801759,0.335801616612577
227
+"Q02874",2,-0.533725672832341,-0.103696713637454,1.43702024004486,-0.799597853575069,FALSE,0.482181768725562,0.233284135996378,0.482181768725562,0.28453409527806
228
+"P38650",3,0.616508841843383,0.325109178337739,-1.48837930793847,0.546761287757353,FALSE,0.48234147672966,0.309968664391753,0.207689858878587,0.48234147672966
229
+"Q9QY17",3,0.7153134665451,1.00461041382569,-0.862744374132729,-0.857179506238064,FALSE,0.482408517652847,0.227858031990631,0.289733450356521,0.482408517652847
230
+"Q63716",1,-1.03152423066447,1.23056444746227,-0.547772491684534,0.348732274886734,FALSE,0.483193897007698,0.483193897007698,0.180430907561429,0.336375195430873
231
+"P62632",3,0.404357095902588,0.605880660403707,-1.49484454777292,0.484606791466622,FALSE,0.48369805768312,0.322274328911196,0.194027613405683,0.48369805768312
232
+"P25113",1,-0.141336993026551,0.370009394473594,-1.30113259623787,1.07246019479083,FALSE,0.483895864657034,0.483895864657034,0.159677662030228,0.356426473312738
233
+"P20760",2,-0.425005494225083,0.192563413252777,1.28994907569098,-1.05750699471867,FALSE,0.485133196131669,0.224028204982317,0.485133196131669,0.290838598886013
234
+"P53987",3,0.190682500449899,1.32298080922427,-0.940915406047772,-0.572747903626395,FALSE,0.486495081455492,0.267584208390395,0.245920710154113,0.486495081455492
235
+"P16036",3,0.283966300393445,0.864276513238112,-1.44393703940052,0.295694225768959,FALSE,0.486824210539606,0.316781429691694,0.196394359768699,0.486824210539606
236
+"P40329",3,0.833153665601106,0.17506641758682,-1.44404430814057,0.435824224952646,FALSE,0.488516461697864,0.286356386990819,0.225127151311317,0.488516461697864
237
+"Q499N5",2,0.93442879400088,0.393438371070514,0.0744543483902053,-1.4023215134616,FALSE,0.488569204066808,0.176652882367415,0.488569204066808,0.334777913565777
238
+"P60711",1,-1.4128422908071,0.00773150552204512,0.611317446405478,0.793793338879579,FALSE,0.488595799983781,0.488595799983781,0.229272143400638,0.282132056615581
239
+"P08733",1,-0.0757050126924025,-0.069497985273342,-1.14782810279411,1.29303110075986,FALSE,0.488665074163096,0.488665074163096,0.171263596191027,0.340071329645877
240
+"P27791",2,1.31266645071091,-0.0488858080404664,-0.144065449810621,-1.11971519285982,FALSE,0.488939650001307,0.17331799852562,0.488939650001307,0.337742351473073
241
+"P20767",2,-0.402545986448142,-0.323937810460321,1.47435207979616,-0.747868282887699,FALSE,0.490837744964936,0.230641838617542,0.490837744964936,0.278520416417522
242
+"Q9EQS0",2,0.96281907097593,0.373201605640607,0.0535242672162572,-1.38954494383279,FALSE,0.49168790095849,0.173240622224272,0.49168790095849,0.335071476817238
243
+"P62630",1,-0.729133141911815,1.13331515503016,-0.944479069125027,0.540297056006682,FALSE,0.492912798994241,0.492912798994241,0.161380660437326,0.345706540568433
244
+"P05964",2,0.646413874375567,-1.42297098946132,0.745897201961113,0.0306599131246435,FALSE,0.492949588595945,0.218297397592105,0.492949588595945,0.28875301381195
245
+"P38652",1,-1.20368817884026,1.14723154066156,-0.31338614506162,0.369842783240312,FALSE,0.492987219911449,0.492987219911449,0.188482087575792,0.318530692512759
246
+"P0C2X9",1,-1.00280094333105,1.20795752930497,-0.609620827231152,0.404464241257241,FALSE,0.494213326226686,0.494213326226686,0.174063775467418,0.331722898305896
247
+"P36970",3,0.145448674848607,1.10005973174975,-1.3274057746853,0.0818973680869483,FALSE,0.494684707885707,0.309442966576852,0.195872325537441,0.494684707885707
248
+"O88767",3,0.612427601145557,0.487241450032504,-1.49399875697727,0.394329705799209,FALSE,0.495703206282943,0.296985165600743,0.207311628116315,0.495703206282943
249
+"Q64057",2,1.01103552060703,0.317593365785639,0.0407792637679587,-1.36940815016063,FALSE,0.495705787758508,0.172026497858953,0.495705787758508,0.332267714382538
250
+"P45953",1,-1.13707370631782,1.1744480942933,-0.423061177926636,0.38568678995115,FALSE,0.496071570252703,0.496071570252703,0.18233162754612,0.321596802201176
251
+"Q9JLZ1",3,0.702725020507606,0.339677523977319,-1.48231916118297,0.439916616698041,FALSE,0.496908902782214,0.292859033179212,0.210232064038574,0.496908902782214
252
+"Q62930",2,-0.0184667811548216,-1.11079712957078,1.31568795357381,-0.186424042848207,FALSE,0.498755284453809,0.228618850359901,0.498755284453809,0.272625865186291
253
+"Q63270",3,0.333460994601858,1.22522462383142,-1.0733478752282,-0.485337743205076,FALSE,0.499000890088005,0.262088508462601,0.238910601449394,0.499000890088005
254
+"P62828",3,1.08615610447503,0.150545905438982,-1.33699031518311,0.100288305269096,FALSE,0.499831444333953,0.250317819169984,0.249850736496063,0.499831444333953
255
+"Q5I0K3",3,0.966957100596458,0.727402116859742,-1.07129291389388,-0.623066303562316,FALSE,0.49988321776596,0.222952464573102,0.277164317660939,0.49988321776596
256
+"P10959",2,0.588138371564071,-1.34990669168875,0.901316524954791,-0.139548204830107,TRUE,0.500311982278316,0.218879560349013,0.500311982278316,0.280808457372672
257
+"P04785",3,0.329939307396937,0.951239594020021,-1.40399419246906,0.1228152910521,TRUE,0.500695076966326,0.2975157821917,0.201789140841973,0.500695076966326
258
+"Q924S5",3,1.05442180351119,0.286468994771267,-1.34392001219493,0.0030292139124756,TRUE,0.501675309975408,0.248595423869759,0.249729266154833,0.501675309975408
259
+"P29418",1,-0.167530871978176,-0.227053025081898,-0.994876685687839,1.38946058274791,TRUE,0.502937074124539,0.502937074124539,0.17693671348491,0.320126212390551
260
+"Q6PDU7",1,-0.196347107405575,-0.379932981038088,-0.86317428582984,1.4394543742735,TRUE,0.503031808388089,0.503031808388089,0.182279212721529,0.314688978890381
261
+"P63029",3,0.841328519368094,0.306937173861929,-1.45125850542196,0.302992812191932,TRUE,0.50424425315531,0.273892018285853,0.221863728558838,0.50424425315531
262
+"P23693",1,-0.187491861704529,-0.393516382974135,-0.858670879114588,1.43967912379325,TRUE,0.504564972693881,0.504564972693881,0.180411620936946,0.315023406369173
263
+"Q3T1K5",1,-1.48313368681763,0.33006314771966,0.461237933334557,0.691832605763415,TRUE,0.504966968069324,0.504966968069324,0.214485248375442,0.280547783555234
264
+"Q7TPB1",3,1.0624155063188,0.260068023185278,-1.34284156388093,0.0203580343768552,TRUE,0.506563379497959,0.246160114297312,0.247276506204729,0.506563379497959
265
+"P68035",1,-0.261905544270804,-0.498690591813308,-0.713653470739271,1.47424960682338,TRUE,0.507508516238521,0.507508516238521,0.18580040798961,0.306691075771869
266
+"Q9JLJ3",3,0.305336219894994,1.19850115939848,-1.16398745336258,-0.33984992593089,TRUE,0.507579648248367,0.26850190105885,0.223918450692783,0.507579648248367
267
+"P27952",3,0.961905524020887,0.359291482633127,-1.39301458321931,0.0718175765653004,TRUE,0.507842615412583,0.254797409121571,0.237359975465846,0.507842615412583
268
+"P15651",1,-0.890769242129233,-0.619910917672807,0.171746326157539,1.3389338336445,TRUE,0.508851871286563,0.508851871286563,0.212987048663813,0.278161080049624
269
+"P00406",1,-1.47943676495414,0.663095302679733,0.2696702138964,0.546671248378007,TRUE,0.508855424384106,0.508855424384106,0.204300329296619,0.286844246319274
270
+"Q68FX0",3,0.743791286290024,0.469361573366731,-1.46988526953728,0.256732409880524,TRUE,0.509281864961607,0.276112599473904,0.214605535564488,0.509281864961607
271
+"Q63799",2,1.33413545605744,-0.154109626414114,-0.0899617531270758,-1.09006407651625,TRUE,0.509510161796236,0.166403378349743,0.509510161796236,0.324086459854021
272
+"P07335",2,1.30871692608124,-1.0524628671515,0.142750109932985,-0.399004168862721,TRUE,0.5096531363789,0.185810245899791,0.5096531363789,0.304536617721309
273
+"Q5RKI0",1,-1.30284284624402,1.05927134854635,-0.152878765508441,0.396450263206107,TRUE,0.509974331425484,0.509974331425484,0.18473218874394,0.305293479830576
274
+"P62282",3,0.902809750274333,0.742355741223915,-1.19712096881397,-0.448044522684274,TRUE,0.510541906215953,0.232595480763426,0.256862613020621,0.510541906215953
275
+"P41562",1,-0.768220641568104,1.07708462548251,-0.929682685326178,0.620818701411769,TRUE,0.51077291358802,0.51077291358802,0.161168037877541,0.328059048534439
276
+"P11517",2,0.45818689951494,-1.33958907498564,0.991668862577832,-0.110266687107128,TRUE,0.511151300529923,0.214345313000584,0.511151300529923,0.274503386469493
277
+"P68511",1,-0.798055082617286,-0.660698360641532,0.0726404894765839,1.38611295378223,TRUE,0.511607837979659,0.511607837979659,0.208926588701591,0.27946557331875
278
+"P63245",2,0.800249147274074,-1.3767364425039,0.674267785064973,-0.0977804898351472,TRUE,0.511705133047677,0.204958335355016,0.511705133047677,0.283336531597307
279
+"P97541",1,-0.97693066423971,-0.559802028816361,0.243268983723973,1.2934637093321,TRUE,0.511855724308528,0.511855724308528,0.21289370900353,0.275250566687942
280
+"Q5I0C3",1,-0.621357185331289,-0.687884989422374,-0.146525576314565,1.45576775106823,TRUE,0.512722364227739,0.512722364227739,0.202415810431858,0.284861825340402
281
+"Q6P747",2,1.2051817455036,0.036715690593303,0.00156003589687326,-1.24345747199378,TRUE,0.512848956548394,0.167975602115112,0.512848956548394,0.319175441336493
282
+"P07150",2,1.28290451090511,-1.08985116702453,0.175268888033425,-0.368322231914007,TRUE,0.513404528860972,0.184789395400823,0.513404528860972,0.301806075738205
283
+"Q9Z1P2",2,-0.125135311419987,0.381364953744286,1.05638404145626,-1.31261368378056,TRUE,0.513885436625431,0.197933736584934,0.513885436625431,0.288180826789635
284
+"Q07439",3,0.862466499703706,0.427304224703055,-1.43286010027288,0.143089375866117,TRUE,0.514338207877354,0.261279870788153,0.224381921334492,0.514338207877354
285
+"O88600",2,1.34706824505792,-0.212309343460355,-0.0691360346563616,-1.06562286694121,TRUE,0.515107806154629,0.165898713512818,0.515107806154629,0.318993480332552
286
+"Q68FS4",1,-0.189784260054557,-0.231110040310402,-0.977406813456026,1.39830111382098,TRUE,0.515439197267124,0.515439197267124,0.17024841079359,0.314312391939287
287
+"P25886",3,0.747505797435708,0.612199345127119,-1.4355138734764,0.0758087309135692,TRUE,0.517043336050865,0.263995389777274,0.218961274171861,0.517043336050865
288
+"P62856",2,-0.152396877788254,0.328294406581949,1.10652350483537,-1.28242103362907,TRUE,0.518791450123198,0.197266796605819,0.518791450123198,0.283941753270984
289
+"P12007",2,1.08825267729644,-1.25325768989134,0.422677421594451,-0.257672408999547,TRUE,0.519095661113399,0.192562788094467,0.519095661113399,0.288341550792134
290
+"Q5XI73",3,0.703335293381523,0.69438526211049,-1.42216422396268,0.0244436684706651,TRUE,0.519351504263968,0.263041080864427,0.217607414871605,0.519351504263968
291
+"P62853",1,-0.210996767304818,-0.260664706358473,-0.942367464273936,1.41402893793723,TRUE,0.519634510688833,0.519634510688833,0.17009296774158,0.310272521569587
292
+"P08010",2,1.29791388180563,-0.994615312919407,0.222626632347056,-0.525925201233283,TRUE,0.52078422024256,0.18560640236384,0.52078422024256,0.293609377393601
293
+"P62198",1,-1.48578407644085,0.458230935720076,0.348644260921328,0.678908879799445,TRUE,0.521028116584393,0.521028116584393,0.202549832524611,0.276422050890997
294
+"Q5U300",1,-0.222349946851389,-0.289018159268012,-0.91399118707545,1.42535929319485,TRUE,0.521385623395803,0.521385623395803,0.170471010136101,0.308143366468096
295
+"Q9JM53",1,-0.825538455960121,-0.602350114046033,0.0297558191317942,1.39813275087436,TRUE,0.522064671665734,0.522064671665734,0.2030035897264,0.274931738607866
296
+"O35878",1,-1.36655654286555,-0.0420760931990507,0.441039025202742,0.967593610861856,TRUE,0.523352454214901,0.523352454214901,0.208234888918969,0.26841265686613
297
+"Q63704",1,-1.38721342397836,0.00626154270392772,0.443407468124519,0.937544413149911,TRUE,0.523709529001622,0.523709529001622,0.207671206722243,0.268619264276135
298
+"P61206",2,0.28526642814357,0.454508253382566,0.734289280721871,-1.47406396224801,TRUE,0.524059184830754,0.183270957243443,0.524059184830754,0.292669857925803
299
+"P50753",1,-0.252765265787015,-0.235628931438395,-0.930818705778685,1.4192129030041,TRUE,0.528293583084288,0.528293583084288,0.168059001097728,0.303647415817984
300
+"Q6RUV5",2,1.05643402751295,0.146727079773443,0.152945782719761,-1.35610689000615,TRUE,0.528358258947281,0.166273564062024,0.528358258947281,0.305368176990695
301
+"P18266",1,-1.46558429178467,0.639160053570951,0.187326529881207,0.639097708332513,TRUE,0.528440635065948,0.528440635065948,0.194346457427371,0.277212907506681
302
+"Q4G069",2,1.31219701807565,-0.997970649526584,0.184079183086686,-0.498305551635749,TRUE,0.528865199649436,0.177315790726836,0.528865199649436,0.293819009623728
303
+"P35704",2,0.608709082732501,-1.32824145137973,0.910395135919007,-0.190862767271781,TRUE,0.529085771747999,0.201989982728494,0.529085771747999,0.268924245523507
304
+"P04639",2,0.677884923135875,0.414986278887402,0.39459433666685,-1.48746553869013,TRUE,0.529393175557406,0.168609406475535,0.529393175557406,0.301997417967059
305
+"P62076",1,-0.516422992830342,0.797668375503833,-1.15489163312675,0.873646250453264,TRUE,0.529837993177067,0.529837993177067,0.148337279692799,0.321824727130134
306
+"P0CG51",1,-1.42281826509725,0.124287889190763,0.407345638794595,0.891184737111889,TRUE,0.532048045322074,0.532048045322074,0.20167403071357,0.266277923964356
307
+"P62083",2,1.03259857425831,0.175598603543809,0.161745750585979,-1.3699429283881,TRUE,0.532698893707384,0.162714402647247,0.532698893707384,0.304586703645369
308
+"B0LPN4",2,1.3042496787138,-0.162345425779799,-0.0139045176986983,-1.1279997352353,TRUE,0.532765336111345,0.158022238436294,0.532765336111345,0.309212425452361
309
+"Q5XIT9",1,-0.305147632512247,-0.3647066519782,-0.794125912121558,1.46398019661201,TRUE,0.532903158322148,0.532903158322148,0.171126764499465,0.295970077178387
310
+"P29117",1,-0.273365045923739,0.226397644372468,-1.17503886678108,1.22200626833235,TRUE,0.5338231346232,0.5338231346232,0.153154882388417,0.313021982988383
311
+"P07871",1,-1.13462557060349,1.08530023761622,-0.49183114495319,0.541156477940463,TRUE,0.534190073369047,0.534190073369047,0.167478611077276,0.298331315553677
312
+"Q9QWN8",2,0.537310057288955,0.421651351975514,0.538778728784445,-1.49774013804891,TRUE,0.534919015652774,0.171510713376773,0.534919015652774,0.293570270970453
313
+"P11507",2,1.0836554678088,0.14055272727641,0.114735948645809,-1.33894414373102,TRUE,0.539227809120023,0.155725169071833,0.539227809120023,0.305047021808144
314
+"P50399",1,-0.9544226834536,1.09904990646176,-0.73212726989488,0.587500046886722,TRUE,0.540253090490093,0.540253090490093,0.153887381537402,0.305859527972505
315
+"P05508",2,0.933293948421451,0.234674396408758,0.25022662416073,-1.41819496899094,TRUE,0.540282774452472,0.161587193116527,0.540282774452472,0.298130032431001
316
+"P80432",1,-0.465807686514058,0.706489302275282,-1.18216288451876,0.941481268757534,TRUE,0.540498044369943,0.540498044369943,0.142523515981062,0.316978439648995
317
+"P26644",2,-0.18142369944573,-0.046129600413803,1.32601986997816,-1.09846657011863,TRUE,0.541350140698145,0.195430352270996,0.541350140698145,0.263219507030859
318
+"Q78P75",2,0.983307677905425,0.191427891032889,0.22085852809513,-1.39559409703344,TRUE,0.541479304051066,0.160659657756886,0.541479304051066,0.297861038192047
319
+"P97532",2,1.38156794344043,-0.688562095462086,0.0876765928495033,-0.780682440827852,TRUE,0.541978456209625,0.1654584825828,0.541978456209625,0.292563061207575
320
+"Q5XIM9",2,1.29156669513146,-0.201371932514382,0.0452595050762073,-1.13545426769328,TRUE,0.542782945431744,0.158011170760936,0.542782945431744,0.29920588380732
321
+"P62268",1,-1.17123237595056,-0.298629652425309,0.255980149804675,1.21388187857119,TRUE,0.544130390800611,0.544130390800611,0.196013584618161,0.259856024581228
322
+"Q8VID1",1,-1.13989967801832,-0.333455602122196,0.234657623184426,1.23869765695609,TRUE,0.544977869126843,0.544977869126843,0.195227554591026,0.259794576282132
323
+"P62898",1,-0.287887149406363,-0.0549052405836734,-1.02345799955041,1.36625038954044,TRUE,0.545515602088644,0.545515602088644,0.156969744196281,0.297514653715076
324
+"P06399",2,-0.0612782451964428,-0.770507479275509,1.42995140475916,-0.598165680287207,TRUE,0.546038589180394,0.201297953796047,0.546038589180394,0.252663457023559
325
+"Q5XIG4",1,-0.300333451638261,0.191172936765903,-1.14276988288864,1.251930397761,TRUE,0.547141410475794,0.547141410475794,0.149493292129013,0.303365297395193
326
+"P14882",2,1.05246188612569,-1.23292864125681,0.512090473610902,-0.331623718479786,TRUE,0.547313708506313,0.179959380561293,0.547313708506313,0.272726910932393
327
+"P24049",1,-1.44768380493906,0.67905263983675,0.112560012907536,0.65607115219477,TRUE,0.549658799112149,0.549658799112149,0.181067932666773,0.269273268221078
328
+"P14480",2,-0.0907631949489523,-0.66583164858452,1.44183218367045,-0.685237340136973,TRUE,0.550235397761398,0.198510791509402,0.550235397761398,0.2512538107292
329
+"P20059",2,-0.0267638237320822,-0.816942812229043,1.41582708410926,-0.572120448148132,TRUE,0.550386799862894,0.198910390980359,0.550386799862894,0.250702809156748
330
+"Q5XHZ0",1,-0.296574095675679,0.0508057301762476,-1.07696196130695,1.32273032680638,TRUE,0.551583536203833,0.551583536203833,0.151215985661027,0.297200478135141
331
+"P56741",1,-0.466576815510493,-0.481388901237946,-0.551017458925199,1.49898317567364,TRUE,0.552656790013598,0.552656790013598,0.170245079147428,0.277098130838974
332
+"Q9EQX9",1,-0.683348229493468,-0.56950281760202,-0.217340991812806,1.47019203890829,TRUE,0.552989551496174,0.552989551496174,0.179922689821079,0.267087758682747
333
+"P23562",2,0.546266988589785,-1.248003765712,1.02089142016628,-0.319154643044071,TRUE,0.554772046006591,0.19048535725959,0.554772046006591,0.254742596733819
334
+"P62703",1,-1.42004877362002,0.741565259607286,0.020358936137696,0.658124577875038,TRUE,0.555081591746676,0.555081591746676,0.176568464888684,0.26834994336464
335
+"P23514",1,-0.874598615199346,-0.506593661460024,-0.0251531445578931,1.40634542121726,TRUE,0.555683051744557,0.555683051744557,0.184253656181303,0.260063292074141
336
+"P30009",2,1.30231981507758,-0.402459114903677,0.15715906681493,-1.05701976698883,TRUE,0.555853341084673,0.162232703672369,0.555853341084673,0.281913955242958
337
+"P34064",2,-0.112467051915412,-0.612979266679844,1.44634472614474,-0.720898407549486,TRUE,0.55718643989106,0.19432017564602,0.55718643989106,0.248493384462919
338
+"P62836",1,-0.78650523727053,-0.522089634730003,-0.137100585080301,1.44569545708083,TRUE,0.557391994057184,0.557391994057184,0.180869057867215,0.261738948075601
339
+"Q704S8",1,-1.1708652328928,0.986630708690962,-0.472977097770467,0.65721162197231,TRUE,0.557401766135612,0.557401766135612,0.163881318720532,0.278716915143856
340
+"P46462",1,-0.818871342991928,0.992382909837861,-0.902100113130873,0.72858854628494,TRUE,0.559076189104646,0.559076189104646,0.144062182990778,0.296861627904576
341
+"Q9WVK7",1,-0.325989379400244,0.0233738739010767,-1.04188052125684,1.344496026756,TRUE,0.559393542594477,0.559393542594477,0.15045634342412,0.290150113981403
342
+"Q63065",2,0.0618231831691719,0.207214335769613,1.07317522490248,-1.34221274384127,TRUE,0.559993325345061,0.176749411963799,0.559993325345061,0.26325726269114
343
+"P11915",1,-1.23484836506617,-0.106458011927366,0.139491815415058,1.20181456157848,TRUE,0.561229636331882,0.561229636331882,0.186959939238746,0.251810424429372
344
+"P11250",1,-0.59107029448575,-0.506463269412623,-0.397763962868612,1.49529752676699,TRUE,0.561821512827734,0.561821512827734,0.171136988754878,0.267041498417388
345
+"P11608",1,-1.44366298618524,0.605500295924797,0.10447983028852,0.733682859971923,TRUE,0.562857382060452,0.562857382060452,0.176438147829873,0.260704470109675
346
+"P83732",1,-0.317472537614832,0.0885287910554093,-1.082433766583,1.31137751314242,TRUE,0.563989234648793,0.563989234648793,0.144602669092307,0.2914080962589
347
+"P27139",2,0.39048467889667,-1.14392996813123,1.1689050862377,-0.415459797003141,TRUE,0.564238124947612,0.188416363700421,0.564238124947612,0.247345511351967
348
+"P50878",2,0.663423439439013,0.292640425534987,0.526259326160386,-1.48232319113439,TRUE,0.565067956118726,0.158539708361389,0.565067956118726,0.276392335519885
349
+"P19804",2,0.983718307210816,0.117568727787527,0.289612193453449,-1.39089922845179,TRUE,0.566200188092842,0.152797347360502,0.566200188092842,0.281002464546656
350
+"P04276",2,0.0148307821100795,-0.761473927006031,1.40801947847706,-0.661376333581112,TRUE,0.566580384928548,0.189698930268793,0.566580384928548,0.243720684802659
351
+"P16409",1,-0.975974365973671,-0.401368409620039,0.00389373191821932,1.37344904367549,TRUE,0.566612368465864,0.566612368465864,0.180469883706829,0.252917747827307
352
+"P17702",1,-1.25236968612297,-0.170035975090315,0.26902695839654,1.15337870281675,TRUE,0.566924793707967,0.566924793707967,0.183445698893585,0.249629507398448
353
+"Q99NA5",1,-0.580187168589801,0.74511314966662,-1.10583705557537,0.940911074498555,TRUE,0.571463477277295,0.571463477277295,0.135237304656463,0.293299218066242
354
+"Q99PS8",2,0.873425984156391,-1.20645703369901,0.769065786599691,-0.436034737057076,TRUE,0.573264695616997,0.175242082111639,0.573264695616997,0.251493222271364
355
+"P06761",1,-1.42387868722725,0.673319488498184,0.0306487859785608,0.719910412750502,TRUE,0.573354501088495,0.573354501088495,0.168904070208415,0.25774142870309
356
+"B0BNE5",2,0.5619290649879,-1.20431251431397,1.03796883290679,-0.39558538358072,TRUE,0.573593370812264,0.180838031387684,0.573593370812264,0.245568597800052
357
+"Q62736",2,-0.00444423298826263,-0.691728306745138,1.41559835314755,-0.719425813414146,TRUE,0.574376924359584,0.185174737749796,0.574376924359584,0.24044833789062
358
+"P48679",2,1.31470890802267,-0.801484641816074,0.242117895262323,-0.755342161468919,TRUE,0.575859249445392,0.155606444156301,0.575859249445392,0.268534306398307
359
+"P13221",1,-1.1224818875927,-0.273927564884718,0.110829879254903,1.28557957322252,TRUE,0.576736988683391,0.576736988683391,0.177174908155853,0.246088103160755
360
+"P62890",2,0.926403337077201,0.124373122992671,0.361810338159014,-1.41258679822889,TRUE,0.577721964320136,0.150056520409083,0.577721964320136,0.272221515270781
361
+"Q66H98",2,1.2155479347593,-0.208529947284694,0.193597836611944,-1.20061582408655,TRUE,0.580159236706161,0.147362624186679,0.580159236706161,0.27247813910716
362
+"P62271",2,0.0854748796023107,0.0812866374284336,1.13567252697943,-1.30243404401018,TRUE,0.580348071986275,0.169675631000375,0.580348071986275,0.24997629701335
363
+"P04762",1,-1.17665763556217,0.950518518461888,-0.472772529641214,0.698911646741496,TRUE,0.581735140186084,0.581735140186084,0.152688952162311,0.265575907651605
364
+"P13086",1,-0.491206664955999,-0.264756821418305,-0.718120314435605,1.47408380080991,TRUE,0.582777861217923,0.582777861217923,0.154096613175893,0.263125525606185
365
+"P38718",2,0.178123553838043,0.121633850559722,1.05605453708522,-1.35581194148298,TRUE,0.583044381253289,0.166565757515281,0.583044381253289,0.25038986123143
366
+"P18886",1,-1.03809119653527,0.941345795275714,-0.669803783620534,0.766549184880087,TRUE,0.583447565193231,0.583447565193231,0.149535151504265,0.267017283302505
367
+"Q4QQT4",2,0.0402508693423748,-0.695572132878278,1.40000299693385,-0.74468173339795,TRUE,0.583534155836117,0.180199282931356,0.583534155836117,0.236266561232527
368
+"P31000",2,0.0979410436793736,-0.833309874393075,1.37406867263867,-0.638699841924972,TRUE,0.584274153266427,0.180056020522215,0.584274153266427,0.235669826211358
369
+"P01026",2,0.426633978530632,-1.04042852269756,1.18641988870454,-0.572625344537611,TRUE,0.585014099871815,0.178234556798444,0.585014099871815,0.236751343329741
370
+"P02680",2,0.0739924899379389,-0.682732467077885,1.38675608187179,-0.778016104731848,TRUE,0.585909360560733,0.178899265937375,0.585909360560733,0.235191373501891
371
+"P09006",2,0.0251629809272163,-0.635286016383908,1.40270750860621,-0.792584473149514,TRUE,0.588188418516241,0.177387674383049,0.588188418516241,0.23442390710071
372
+"Q02253",1,-1.38332891742223,0.705245497454493,-0.084710182239651,0.76279360220739,TRUE,0.588810614456627,0.588810614456627,0.160767811592497,0.250421573950876
373
+"P81155",1,-0.45437280199218,-0.149877749807794,-0.835530790810652,1.43978134261063,TRUE,0.588897355791885,0.588897355791885,0.14756495992195,0.263537684286164
374
+"P02651",2,0.908514198456601,-1.17523835602384,0.748929243932219,-0.48220508636498,TRUE,0.589479740986004,0.166224214525824,0.589479740986004,0.244296044488173
375
+"Q62651",1,-1.15280996392757,0.938932406834555,-0.512158676524643,0.726036233617657,TRUE,0.589544023742581,0.589544023742581,0.149022160661191,0.261433815596228
376
+"B0BNN3",2,0.390558126887882,-1.0686431425499,1.19798561979193,-0.519900604129914,TRUE,0.589767127988237,0.175398022256502,0.589767127988237,0.23483484975526
377
+"Q2TA68",1,-0.458730967076316,-0.113103111523554,-0.85716573969834,1.42899981829821,TRUE,0.589908844395593,0.589908844395593,0.147129669282744,0.262961486321664
378
+"P29314",1,-1.4241520833368,0.432312680389291,0.113150914029928,0.878688488917583,TRUE,0.592062435547034,0.592062435547034,0.165078344897873,0.242859219555092
379
+"P10860",1,-1.24546504676826,0.905248286711624,-0.364432841381446,0.704649601438082,TRUE,0.592400418959059,0.592400418959059,0.150192029431159,0.257407551609782
380
+"Q68FT1",2,1.0953420321444,-1.04839999668325,0.568129143791432,-0.61507117925258,TRUE,0.593954118334036,0.159772181506363,0.593954118334036,0.2462737001596
381
+"P02401",1,-1.32729837485102,0.0744205458635489,0.153211073339472,1.099666755648,TRUE,0.595486522843963,0.595486522843963,0.167703732430095,0.236809744725942
382
+"P48721",1,-0.962941416308281,0.915262859291596,-0.761622720814342,0.809301277831027,TRUE,0.596429164735096,0.596429164735096,0.140954272974402,0.262616562290502
383
+"P56571",1,-0.451176814948704,-0.0449160819376839,-0.907671498563243,1.40376439544963,TRUE,0.596437193447726,0.596437193447726,0.142121654985811,0.261441151566463
384
+"Q5BJQ0",2,1.08726159627616,-1.04336610793286,0.581494870801643,-0.625390359144938,TRUE,0.598733502834577,0.15779949659186,0.598733502834577,0.243467000573563
385
+"P13635",2,0.283953775325823,-0.922570200750295,1.28479229045635,-0.646175865031879,TRUE,0.599730578327279,0.171471415207603,0.599730578327279,0.228798006465118
386
+"Q9QX79",2,1.00288406721337,-1.05457723129276,0.689455774020256,-0.637762609940871,TRUE,0.601110921387829,0.160462657163908,0.601110921387829,0.238426421448262
387
+"P20759",2,0.162063304269774,-0.596716697311395,1.34053702466903,-0.905883631627405,TRUE,0.601258282979848,0.170486445442195,0.601258282979848,0.228255271577958
388
+"P47853",2,0.0975859407159747,-0.607614700796025,1.37108263321649,-0.861053873136442,TRUE,0.601420653200059,0.170250389902375,0.601420653200059,0.228328956897566
389
+"Q07936",2,1.2162882689319,-0.286503049997499,0.244441082290886,-1.17422630122529,TRUE,0.601590778640677,0.140129728028222,0.601590778640677,0.258279493331101
390
+"P31399",1,-0.470208570391622,-0.0412241154858339,-0.894592914726523,1.40602560060398,TRUE,0.603114678594224,0.603114678594224,0.139964001713339,0.256921319692437
391
+"P01946",2,0.562191521135483,-1.09254439867149,1.08665387094115,-0.556300993405134,TRUE,0.603580759575001,0.166798209898841,0.603580759575001,0.229621030526158
392
+"P23764",2,1.14076870532357,-0.995727031920226,0.517672307678158,-0.662713981081502,TRUE,0.603811406155732,0.153025470453933,0.603811406155732,0.243163123390335
393
+"P61980",2,1.28512705913331,-0.585331025514121,0.266940206762592,-0.966736240381781,TRUE,0.6039478158988,0.142630856199369,0.6039478158988,0.253421327901831
394
+"Q63041",2,0.170731195865037,-0.691886992252908,1.34601365554104,-0.824857859153172,TRUE,0.604637921882012,0.169047421043804,0.604637921882012,0.226314657074184
395
+"Q63798",2,0.480211732431078,0.15571451110359,0.809633567980214,-1.44555981151488,TRUE,0.605996584318043,0.149627704479565,0.605996584318043,0.244375711202392
396
+"Q8K4G6",2,0.977227619618984,-1.10964231740671,0.700617815697088,-0.568203117909363,TRUE,0.606068300456273,0.156963643306675,0.606068300456273,0.236968056237052
397
+"Q9JJW3",1,-0.588897268266176,-0.252317692185216,-0.636680201721688,1.47789516217308,TRUE,0.606529155982007,0.606529155982007,0.146738017450333,0.246732826567661
398
+"Q01129",2,1.06209980219484,-1.06407929662946,0.609133357503201,-0.607153863068581,TRUE,0.608567102233499,0.153114698066741,0.608567102233499,0.23831819969976
399
+"P20761",2,1.25414499282135,-0.472901286199923,0.279569852816653,-1.06081355943808,TRUE,0.611174939436323,0.139245097942022,0.611174939436323,0.249579962621655
400
+"O35413",1,-0.781381830599306,0.835071675856656,-0.946262246603309,0.892572401345959,TRUE,0.611508010374875,0.611508010374875,0.126251958649903,0.262240030975222
401
+"P62494",1,-0.875226642368928,-0.321562156996831,-0.242564692226915,1.43935349159267,TRUE,0.612115832270753,0.612115832270753,0.154033975520705,0.233850192208542
402
+"P31232",2,0.0852877705736374,-0.475230474522176,1.35489685305067,-0.964954149102127,TRUE,0.613033925209356,0.163049959032097,0.613033925209356,0.223916115758547
403
+"P47858",2,1.09377304025547,-1.01669877290107,0.580742254098493,-0.657816521452892,TRUE,0.613205719824364,0.150363905136965,0.613205719824364,0.23643037503867
404
+"Q8VHF5",1,-0.630732436452763,0.667069504356059,-1.05656505713357,1.02022798923028,TRUE,0.613213589240986,0.613213589240986,0.12390117234277,0.262885238416244
405
+"P11232",1,-1.10827386841977,0.914194174504143,-0.580139811657746,0.774219505573374,TRUE,0.613746786985464,0.613746786985464,0.136871734791387,0.249381478223149
406
+"P42930",1,-1.39057076074652,0.603721914117707,-0.0494453408659702,0.836294187494779,TRUE,0.614555005996035,0.614555005996035,0.150271058207914,0.235173935796051
407
+"P18418",2,0.382490457142129,0.0804148684808296,0.939037368943889,-1.40194269456685,TRUE,0.614913837504389,0.149587238686868,0.614913837504389,0.235498923808742
408
+"P08649",2,0.339763624111834,-0.898697034072057,1.25944146034262,-0.700508050382392,TRUE,0.616047666918508,0.16294526342141,0.616047666918508,0.221007069660082
409
+"P04166",1,-1.38864635228415,0.381825318512846,0.0456843774702084,0.961136656301095,TRUE,0.616572549732581,0.616572549732581,0.153943971567067,0.229483478700353
410
+"P07340",2,1.08387060678733,-0.167734548356789,0.371822623296161,-1.2879586817267,TRUE,0.616919004644535,0.137611760380293,0.616919004644535,0.245469234975173
411
+"Q01177",2,1.24932283618298,-0.699201362739387,0.356996652904822,-0.907118126348413,TRUE,0.618365154925857,0.140188232808943,0.618365154925857,0.2414466122652
412
+"Q68FP1",2,0.534522985379896,-1.03781470847353,1.12071850802388,-0.617426784930247,TRUE,0.619485164167841,0.159389364778636,0.619485164167841,0.221125471053523
413
+"P06866",2,0.357087461355177,-0.865334063347174,1.25275441395408,-0.744507811962079,TRUE,0.619988943031502,0.161078286568287,0.619988943031502,0.218932770400211
414
+"P01836",2,0.53098960676532,-0.920346061893419,1.14209944837598,-0.752742993247878,TRUE,0.620465254429056,0.160411176398702,0.620465254429056,0.219123569172242
415
+"P58775",2,0.340197608778361,0.011671454259343,1.01196770464695,-1.36383676768466,TRUE,0.621340261228468,0.149114914499095,0.621340261228468,0.229544824272437
416
+"B0K020",1,-0.737154900693624,-0.282206753622316,-0.45401334358513,1.47337499790107,TRUE,0.622642766152001,0.622642766152001,0.144695430051474,0.232661803796525
417
+"Q7TQ16",1,-0.499977124470033,0.12996983278078,-0.969266257518969,1.33927354920822,TRUE,0.623065855323141,0.623065855323141,0.129167373647073,0.247766771029786
418
+"P62250",2,0.1862367106406,-0.175732438444619,1.20602380847882,-1.2165280806748,TRUE,0.623902176962571,0.153136014390352,0.623902176962571,0.222961808647077
419
+"Q07969",1,-1.38245722875248,0.400738690947735,0.0184532631653863,0.963265274639362,TRUE,0.626172047681071,0.626172047681071,0.148866850601388,0.224961101717541
420
+"P21396",1,-0.788588412440127,0.776538914982373,-0.936058855334124,0.948108352791878,TRUE,0.626627190546184,0.626627190546184,0.12400081120555,0.249371998248266
421
+"Q5XIM5",1,-0.908053298894656,-0.24967146778828,-0.27053153200154,1.42825629868448,TRUE,0.62840480164489,0.62840480164489,0.146935353511031,0.22465984484408
422
+"P12075",1,-1.26793202105795,0.0743770286177042,0.0160324197879628,1.17752257265228,TRUE,0.628783345705579,0.628783345705579,0.151057019783487,0.220159634510934
423
+"P15800",1,-0.784297472230128,0.778381404337792,-0.940170367838262,0.946086435730598,TRUE,0.630181522806143,0.630181522806143,0.121503766758717,0.24831471043514
424
+"Q9WTT6",2,0.80890406594525,-1.08222417923816,0.890686944696315,-0.617366831403408,TRUE,0.630522279120668,0.149724597009018,0.630522279120668,0.219753123870315
425
+"P35171",1,-1.38077398054179,0.4633691767383,-0.0198038330037166,0.937208636807204,TRUE,0.63067939138549,0.63067939138549,0.145635429725539,0.223685178888972
426
+"Q6NYB7",2,0.224068341391805,-0.635255378800842,1.315031798246,-0.903844760836961,TRUE,0.631567798449192,0.154848386319039,0.631567798449192,0.213583815231769
427
+"Q64560",2,1.14214132967965,-0.858480449230577,0.535772966562172,-0.819433847011242,TRUE,0.634612498577973,0.139592505403837,0.634612498577973,0.22579499601819
428
+"P04937",2,0.753607266463898,-0.986941201935232,0.962480419134432,-0.729146483663098,TRUE,0.636212108450428,0.149763954551549,0.636212108450428,0.214023936998024
429
+"Q4QQV3",1,-0.66920500946155,-0.165917039675088,-0.625492610864666,1.4606146600013,TRUE,0.637520237087128,0.637520237087128,0.134917141076905,0.227562621835967
430
+"Q6AXV4",1,-1.19076943099747,0.830227067268889,-0.463077782910879,0.82362014663946,TRUE,0.638001852078818,0.638001852078818,0.131401321939188,0.230596825981994
431
+"Q5XIN6",1,-0.998710018616846,0.8672376187346,-0.722246894865003,0.85371929474725,TRUE,0.638497732882179,0.638497732882179,0.124044400022645,0.237457867095176
432
+"P62260",1,-1.13114051320034,0.878930425527785,-0.550724876570803,0.80293496424336,TRUE,0.638585346601011,0.638585346601011,0.126903846302997,0.234510807095993
433
+"P60868",1,-1.35936752610052,0.493426954703629,-0.0836162185579383,0.949556789954831,TRUE,0.640188809228652,0.640188809228652,0.140983957888114,0.218827232883234
434
+"Q9Z1Y3",1,-0.846558817209897,0.806062699653354,-0.883295278716713,0.923791396273256,TRUE,0.64060626401729,0.64060626401729,0.118833154874768,0.240560581107942
435
+"P11884",1,-0.934130101211601,-0.21801463435277,-0.265400099792983,1.41754483535735,TRUE,0.644041031569403,0.644041031569403,0.139656213053331,0.216302755377266
436
+"P02466",2,1.12897992566093,-0.86866329718979,0.554292571526405,-0.814609199997548,TRUE,0.644803018149422,0.134959805394285,0.644803018149422,0.220237176456293
437
+"P47875",2,0.887628485937433,-1.05443716804006,0.820413622334687,-0.653604940232057,TRUE,0.644813220099255,0.141154709477483,0.644813220099255,0.214032070423262
438
+"P14604",1,-1.34906799541284,0.418209969856853,-0.0692987838597552,1.00015680941574,TRUE,0.64726783238056,0.64726783238056,0.138957048676429,0.213775118943011
439
+"P12346",2,0.492406583688901,-0.881852948783289,1.17043750995543,-0.780991144861046,TRUE,0.651208130826744,0.144827266043278,0.651208130826744,0.203964603129979
440
+"P38983",1,-1.15720818305547,0.839460259971627,-0.514065048207758,0.831812971291606,TRUE,0.651338424935225,0.651338424935225,0.123663794429959,0.224997780634816
441
+"P62243",2,0.302790675173723,-0.304602976459511,1.187399553815,-1.18558725252922,TRUE,0.653298850899133,0.140734946893777,0.653298850899133,0.20596620220709
442
+"P29419",1,-0.606514491268633,0.400529539212232,-1.00391794488732,1.20990289694372,TRUE,0.653922632893295,0.653922632893295,0.115460494580873,0.230616872525832
443
+"Q9WUS0",2,1.15582439339274,-0.489244716590903,0.44212790261472,-1.10870757941655,TRUE,0.653981236503598,0.12657937476653,0.653981236503598,0.219439388729872
444
+"Q811A2",1,-1.24764052788887,0.102871307721149,-0.0511385745272793,1.195907794695,TRUE,0.655963667441655,0.655963667441655,0.137590945301286,0.206445387257058
445
+"P51886",2,0.344380836895407,-0.203032373733553,1.11890342464338,-1.26025188780523,TRUE,0.65608551366561,0.13734924666152,0.65608551366561,0.206565239672871
446
+"O35303",1,-1.3054140144265,0.238038045433344,-0.0449251895122416,1.1123011585054,TRUE,0.656798295806818,0.656798295806818,0.136459024020786,0.206742680172396
447
+"Q05962",1,-0.708480998497477,-0.134760379718754,-0.609002011946463,1.45224339016269,TRUE,0.657030400862299,0.657030400862299,0.126986528641834,0.215983070495866
448
+"P40307",2,0.946725307607577,-0.150731489062729,0.541201720027968,-1.33719553857282,TRUE,0.657743758870596,0.12426907229726,0.657743758870596,0.217987168832144
449
+"Q63081",2,0.580223922754806,-0.0831099267384291,0.876803339177833,-1.37391733519421,TRUE,0.658103999548362,0.131663438537063,0.658103999548362,0.210232561914575
450
+"Q5XIF6",1,-0.59300662846968,0.0749073486863052,-0.860887544919984,1.37898682470336,TRUE,0.659721113719682,0.659721113719682,0.118791935641917,0.221486950638401
451
+"P42123",1,-0.685045635814527,-0.0774279367606676,-0.675653562098333,1.43812713467353,TRUE,0.66005475907649,0.66005475907649,0.124719643654102,0.215225597269408
452
+"Q5XIC0",1,-0.925292031940247,0.768427646825985,-0.79936345267094,0.956227837785201,TRUE,0.660460357760541,0.660460357760541,0.11713352251779,0.222406119721669
453
+"P04636",1,-0.587545692388514,0.16668498401202,-0.916167246451181,1.33702795482767,TRUE,0.660999583256369,0.660999583256369,0.116601085389528,0.222399331354103
454
+"P29457",2,0.483765543336224,-0.114659136138129,0.974046039380017,-1.34315244657811,TRUE,0.661283072217579,0.132000070010786,0.661283072217579,0.206716857771636
455
+"O08557",2,0.370248667582816,-0.24542399633617,1.1197239481654,-1.24454861941204,TRUE,0.661899174280265,0.135379458411178,0.661899174280265,0.202721367308557
456
+"Q6UPE1",1,-0.801987920857487,0.676482923806955,-0.909695566014417,1.03520056306495,TRUE,0.662227882864546,0.662227882864546,0.114360546230721,0.223411570904732
457
+"P80254",1,-1.20149526553049,0.0621757201132562,-0.102470718137978,1.24179026355521,TRUE,0.663331604577516,0.663331604577516,0.134249068974493,0.202419326447991
458
+"P63018",1,-1.33518853352291,0.512504082016222,-0.143728171804577,0.966412623311266,TRUE,0.663601352069788,0.663601352069788,0.129480114995702,0.20691853293451
459
+"Q6P6R2",1,-0.597410135732198,0.321110766983129,-0.980290822417484,1.25659019116655,TRUE,0.66364432859454,0.66364432859454,0.112492316959196,0.223863354446264
460
+"P63039",1,-0.628353206257789,0.0262462865979627,-0.799677435819485,1.40178435547931,TRUE,0.663779255075204,0.663779255075204,0.119593040653008,0.216627704271789
461
+"O88761",1,-1.18781959870219,0.785649276296788,-0.466361215475405,0.868531537880808,TRUE,0.666367114521372,0.666367114521372,0.119850204502128,0.213782680976499
462
+"P41123",1,-1.2974212707702,0.254523149680236,-0.073571009260818,1.11646913035078,TRUE,0.666913298036342,0.666913298036342,0.131581393201253,0.201505308762405
463
+"B4F7A1",1,-0.773188375230204,0.67730065186968,-0.936649032779207,1.03253675613973,TRUE,0.667322706468449,0.667322706468449,0.109215813636896,0.223461479894656
464
+"P32551",1,-0.826939415852127,0.7161688214401,-0.892543592377494,1.00331418678952,TRUE,0.668559702430974,0.668559702430974,0.110244977352521,0.221195320216505
465
+"O35115",2,0.441607480316347,-0.175471856152593,1.03714122390325,-1.30327684806701,TRUE,0.669256191641784,0.129940150336953,0.669256191641784,0.200803658021263
466
+"B2GV54",1,-1.23803880474347,0.123656648578671,-0.0874193299247909,1.20180148608959,TRUE,0.669314844529765,0.669314844529765,0.131189365219566,0.199495790250669
467
+"P07872",1,-1.1985775963355,0.122683699025297,-0.158324053333857,1.23421795064406,TRUE,0.669878017641678,0.669878017641678,0.131688444376467,0.198433537981856
468
+"P26772",1,-0.62356012123183,0.1530894551725,-0.877658433264579,1.34812909932391,TRUE,0.67032807353076,0.67032807353076,0.11509561880833,0.21457630766091
469
+"P14046",2,0.793894451710395,-0.944825897768602,0.931516385006709,-0.780584938948503,TRUE,0.67076608594055,0.132234597955895,0.67076608594055,0.196999316103554
470
+"P24268",1,-1.27997407702023,0.656657100901126,-0.295056349254152,0.91837332537326,TRUE,0.671308905306172,0.671308905306172,0.122836863110632,0.205854231583196
471
+"P56574",1,-0.69779180033383,-0.0361393573241674,-0.691914272275097,1.42584542993309,TRUE,0.671382007972455,0.671382007972455,0.119942613668811,0.208675378358734
472
+"P62963",1,-1.28391328785573,0.239481903951613,-0.0896652724132517,1.13409665631737,TRUE,0.671445028409988,0.671445028409988,0.129669897676424,0.198885073913589
473
+"Q66HD0",2,0.673597714134831,-0.129521144222161,0.819172220800402,-1.36324879071307,TRUE,0.673149575442523,0.124484995480452,0.673149575442523,0.202365429077026
474
+"P18163",1,-0.958611485553349,0.739908154897204,-0.759464877062141,0.978168207718286,TRUE,0.674995273741359,0.674995273741359,0.11375794868961,0.211246777569031
475
+"Q8VIF7",2,0.680844497284992,-0.138035453509965,0.817190020421299,-1.35999906419633,TRUE,0.676308486146609,0.123106776894376,0.676308486146609,0.200584736959015
476
+"P13697",1,-1.06056424115228,0.768376592709003,-0.641977901960249,0.934165550403522,TRUE,0.67676238781279,0.67676238781279,0.114567720247703,0.208669891939507
477
+"D3ZAF6",1,-0.795794121431482,0.657100799760661,-0.911803770166623,1.05049709183744,TRUE,0.6775344763809,0.6775344763809,0.107478750476181,0.214986773142919
478
+"P36201",1,-0.68038849577225,0.0094772643020312,-0.739700358071874,1.41061158954209,TRUE,0.677999617639185,0.677999617639185,0.115826468327967,0.206173914032848
479
+"P11240",1,-1.02659124692239,-0.0449593768298388,-0.291865521017455,1.36341614476968,TRUE,0.679657022750535,0.679657022750535,0.125401371335918,0.194941605913547
480
+"P20280",2,1.10868184216276,-0.514436491178559,0.518234884361035,-1.11248023534523,TRUE,0.680773298727326,0.117071846721405,0.680773298727326,0.202154854551269
481
+"P10888",1,-0.675692051961226,0.0706804130712309,-0.782718809037126,1.38773044792712,TRUE,0.682135564569399,0.682135564569399,0.113539635077294,0.204324800353306
482
+"P70623",2,0.405179407448735,-0.558298613544979,1.19736501886647,-1.04424581277022,TRUE,0.683127343806171,0.1289989697794,0.683127343806171,0.187873686414429
483
+"P12847",1,-0.685126579506199,0.0107111177813645,-0.735887962564606,1.41030342428944,TRUE,0.683365384676574,0.683365384676574,0.113446405976368,0.203188209347058
484
+"Q03344",1,-0.659696754311584,0.19869768463916,-0.869286660601423,1.33028573027385,TRUE,0.683767088461086,0.683767088461086,0.110709384559118,0.205523526979796
485
+"P11762",2,0.488807019107611,-0.25298621879045,1.03735146328237,-1.27317226359953,TRUE,0.684495095776713,0.124218224805843,0.684495095776713,0.191286679417444
486
+"Q9Z1N4",1,-1.23313661054892,0.677449504808424,-0.380199830355978,0.93588693609647,TRUE,0.685027484608136,0.685027484608136,0.116180824722715,0.198791690669148
487
+"P08503",1,-0.87626686802145,0.68111105824002,-0.83762293110798,1.03277874088941,TRUE,0.685705130931341,0.685705130931341,0.107841149819472,0.206453719249186
488
+"P04906",1,-1.21582740418125,0.125221122690545,-0.129742177385399,1.22034845887611,TRUE,0.686270892151961,0.686270892151961,0.123166625652263,0.190562482195776
489
+"O55171",1,-0.903023485685869,0.655863268295714,-0.804818477869452,1.05197869525961,TRUE,0.686855211893435,0.686855211893435,0.110641466934358,0.202503321172206
490
+"Q63862",2,0.517652161163523,-0.748898584457472,1.15110611737193,-0.919859694077984,TRUE,0.687730663364039,0.12724122001147,0.687730663364039,0.185028116624491
491
+"Q63797",2,0.515706069951749,-0.319354385828572,1.0447990119352,-1.24115069605838,TRUE,0.688684702699872,0.123571439145975,0.688684702699872,0.187743858154153
492
+"Q9Z0W7",1,-0.67845705558116,0.081058873824372,-0.78635463795795,1.38375281971474,TRUE,0.690179657430103,0.690179657430103,0.109736789857772,0.200083552712124
493
+"Q9EQP5",2,0.565080295586731,-0.720110165324766,1.11436315883433,-0.959333289096297,TRUE,0.690492974485912,0.126015223702219,0.690492974485912,0.183491801811869
494
+"Q3KR86",1,-1.01463515897453,0.735023183280667,-0.694209895016512,0.973821870710374,TRUE,0.692675711907811,0.692675711907811,0.107706398171985,0.199617889920205
495
+"Q2PQA9",1,-0.895317258570602,0.731349948043854,-0.82633666833981,0.990303978866558,TRUE,0.693619336715484,0.693619336715484,0.101604001980033,0.204776661304482
496
+"Q2PS20",1,-1.24349592392201,0.228326048394248,-0.158110249511984,1.17328012503974,TRUE,0.694156414265086,0.694156414265086,0.119444049558995,0.186399536175919
497
+"P27321",2,0.454757736352876,-0.412211456008723,1.12379716853757,-1.16634344888172,TRUE,0.694567473391545,0.122141550911452,0.694567473391545,0.183290975697004
498
+"P02650",2,0.859635355917474,-0.838417441438135,0.871960628912477,-0.893178543391817,TRUE,0.69468811391236,0.12075325326925,0.69468811391236,0.18455863281839
499
+"Q9Z0J5",1,-0.738642553359736,0.019681706008068,-0.68827132621593,1.4072321735676,TRUE,0.696888562807627,0.696888562807627,0.109862396661564,0.19324904053081
500
+"P23928",1,-0.667348943380565,0.211324108857495,-0.868803014781052,1.32482784930412,TRUE,0.696934021666625,0.696934021666625,0.104684880042879,0.198381098290496
501
+"Q9Z1H9",2,1.05993604832349,-0.653284728971853,0.623436696927137,-1.03008801627877,TRUE,0.69709279326001,0.113690779578907,0.69709279326001,0.189216427161083
502
+"P35738",2,1.01053313280792,-0.707693603981271,0.694788442906673,-0.99762797173332,TRUE,0.697517346650864,0.115858574401805,0.697517346650864,0.186624078947331
503
+"Q64591",1,-0.759303594569315,0.42239534080674,-0.877558932695935,1.21446718645851,TRUE,0.699567979824588,0.699567979824588,0.105802980330483,0.19462903984493
504
+"P48037",2,0.692119996706304,-0.265489505468854,0.872842764207288,-1.29947325544474,TRUE,0.701879041687334,0.114655003729355,0.701879041687334,0.183465954583311
505
+"P15429",2,0.891149985439135,-0.786802945464505,0.83702518561354,-0.941372225588171,TRUE,0.703548491429438,0.116262206795481,0.703548491429438,0.180189301775081
506
+"P02454",2,0.905031785827905,-0.829835769027947,0.825380219196657,-0.900576235996614,TRUE,0.70419114047092,0.115177584169911,0.70419114047092,0.18063127535917
507
+"P62919",1,-1.23244219332935,0.212335398496676,-0.166589411684196,1.18669620651687,TRUE,0.707127941745914,0.707127941745914,0.113283757508121,0.179588300745965
508
+"P67779",1,-1.0883086799354,0.661645853112395,-0.588787155859945,1.01544998268295,TRUE,0.707250272726834,0.707250272726834,0.106924046279008,0.185825680994158
509
+"O35077",1,-0.817883244179259,-0.0123322096863022,-0.581457891974591,1.41167334584015,TRUE,0.707357273165425,0.707357273165425,0.108025370678316,0.184617356156259
510
+"P41565",1,-1.26476488982974,0.42863404896448,-0.24037411133899,1.07650495220425,TRUE,0.707587475205623,0.707587475205623,0.111665312525499,0.180747212268878
511
+"Q5XFX0",2,0.559313372540016,-0.316198543774425,1.00929063514242,-1.25240546390801,TRUE,0.709407765535372,0.113254655115838,0.709407765535372,0.17733757934879
512
+"P13437",1,-0.957407010055961,0.663914884832136,-0.747546962355251,1.04103908757908,TRUE,0.70996518749997,0.70996518749997,0.101765987978721,0.188268824521309
513
+"P05065",1,-1.07735498552758,0.722543094591348,-0.614519547442156,0.969331438378388,TRUE,0.710076617504184,0.710076617504184,0.101758608233677,0.188164774262138
514
+"O35264",2,0.569482358705203,-0.707524707040695,1.10959091884696,-0.971548570511472,TRUE,0.710934961177552,0.116001301032643,0.710934961177552,0.173063737789805
515
+"P15999",1,-0.724107601596488,0.156337599403011,-0.78617232181351,1.35394232400699,TRUE,0.711343388372412,0.711343388372412,0.10229669766853,0.186359913959058
516
+"O70351",1,-1.13823671948862,0.692000516614328,-0.527211519807892,0.973447722682187,TRUE,0.711803728742687,0.711803728742687,0.10332072449059,0.184875546766723
517
+"P10536",1,-1.24610295450899,0.280305504887791,-0.188768564048309,1.15456601366951,TRUE,0.714406848380261,0.714406848380261,0.109677739581353,0.175915412038386
518
+"Q5U216",2,0.98097889447398,-0.536584435478646,0.686377020249097,-1.13077147924443,TRUE,0.714796919342007,0.107506175341315,0.714796919342007,0.177696905316678
519
+"P04764",1,-0.745678613374819,0.113171010050326,-0.739947598144616,1.37245520146911,TRUE,0.715318509183023,0.715318509183023,0.101764954137349,0.182916536679628
520
+"P97852",1,-1.07780380960765,0.619952385548442,-0.592409793227392,1.0502612172866,TRUE,0.715473026677177,0.715473026677177,0.105059779660166,0.179467193662657
521
+"P05545",2,0.634244682656936,-0.563964427654486,1.03191379563016,-1.10219405063261,TRUE,0.717453498915437,0.112592637301914,0.717453498915437,0.169953863782648
522
+"Q9R063",1,-0.793046701978257,0.0413002784052446,-0.645598734183537,1.39734515775655,TRUE,0.717912470996466,0.717912470996466,0.102539156328671,0.179548372674863
523
+"P85834",1,-0.919394786963388,0.0124533169438206,-0.480147689610525,1.38708915963009,TRUE,0.719118746733641,0.719118746733641,0.105731262275978,0.175149990990381
524
+"D3Z9R8",1,-1.00486648641307,0.695434177564073,-0.699315599165439,1.00874790801444,TRUE,0.719305710326278,0.719305710326278,0.0972270887067811,0.183467200966941
525
+"P45592",1,-1.13786951801662,0.115717552643501,-0.253602082848466,1.27575404822158,TRUE,0.719380290871077,0.719380290871077,0.108152713643824,0.172466995485099
526
+"P05544",2,0.854783773442685,-0.63963521802757,0.850827266027975,-1.06597582144309,TRUE,0.719419667522413,0.109800085605818,0.719419667522413,0.170780246871769
527
+"P24090",2,0.921002879400943,-0.661826300703325,0.786968690429269,-1.04614526912689,TRUE,0.720876980396259,0.107574745842733,0.720876980396259,0.171548273761008
528
+"P49242",1,-1.24643486859391,0.402571478858155,-0.25934784118729,1.10321123092304,TRUE,0.721061660754763,0.721061660754763,0.106045470251539,0.172892868993698
529
+"P86252",2,0.909273827400644,-0.457347136781224,0.738903442499646,-1.19083013311907,TRUE,0.721551034862983,0.105408694267204,0.721551034862983,0.173040270869813
530
+"P61016",1,-0.870213552556973,0.0187279315425049,-0.543758029133742,1.39524365014821,TRUE,0.722067533236581,0.722067533236581,0.103160312786235,0.174772153977185
531
+"P62907",1,-1.13878165567612,0.674041911984698,-0.522895752587309,0.987635496278727,TRUE,0.723543060740062,0.723543060740062,0.0987136367402444,0.177743302519694
532
+"P16303",2,0.883516348871785,-0.542782776318995,0.795742947469058,-1.13647652002185,TRUE,0.724180817139067,0.106210842107814,0.724180817139067,0.169608340753119
533
+"P85125",2,0.952077877626545,-0.490741849132921,0.703758196550649,-1.16509422504427,TRUE,0.726481514370216,0.10226071785159,0.726481514370216,0.171257767778195
534
+"P19511",1,-0.770556842626532,0.147975799600781,-0.735261373389242,1.35784241641499,TRUE,0.728843083104169,0.728843083104169,0.0968214014890013,0.17433551540683
535
+"P57093",1,-0.882642589584684,0.056353645865472,-0.555460095647849,1.38174903936706,TRUE,0.728917265956777,0.728917265956777,0.100814896931464,0.170267837111758
536
+"P12001",1,-0.741304427532002,0.367374120806414,-0.872655548572389,1.24658585529798,TRUE,0.729083108681715,0.729083108681715,0.0920697808040263,0.178847110514259
537
+"P21913",2,0.916646946907413,-0.459720418639509,0.731751447608624,-1.18867797587653,TRUE,0.729123597368674,0.101616452299445,0.729123597368674,0.169259950331881
538
+"P10719",1,-0.786139691023282,0.449812982768322,-0.862150879344056,1.19847758759902,TRUE,0.729268826634717,0.729268826634717,0.0927670514575292,0.177964121907753
539
+"P53534",2,0.905235622782682,-0.552303696579053,0.775697001343731,-1.12862892754736,TRUE,0.729417134641274,0.103246026917218,0.729417134641274,0.167336838441508
540
+"Q03626",2,0.955069258540878,-0.598864822802357,0.734521153346977,-1.0907255890855,TRUE,0.731430816108591,0.101205705797253,0.731430816108591,0.167363478094156
541
+"P34058",1,-0.880469794756418,0.616264641983705,-0.819235599602198,1.08344075237491,TRUE,0.73275891535876,0.73275891535876,0.0897655450528689,0.177475539588371
542
+"P02767",2,0.83127697537868,-0.468770525776114,0.824611408578162,-1.18711785818073,TRUE,0.733676367457444,0.101825067634212,0.733676367457444,0.164498564908344
543
+"P04904",1,-0.93347486681692,0.600765691983322,-0.758944704393074,1.09165387922667,TRUE,0.736170857280464,0.736170857280464,0.0919680402068713,0.171861102512665
544
+"O89049",1,-0.817860182392178,0.385232243289297,-0.805722569409257,1.23835050851214,TRUE,0.737998382711869,0.737998382711869,0.0929239414386314,0.169077675849499
545
+"P35434",1,-1.04708951247394,0.124468688111093,-0.393820135095721,1.31644095945856,TRUE,0.744883255786951,0.744883255786951,0.0967832850414851,0.158333459171564
546
+"Q60587",1,-1.02967075227574,0.589227304659668,-0.644530873782009,1.08497432139808,TRUE,0.745112006523767,0.745112006523767,0.0918145561439228,0.16307343733231
547
+"Q06647",1,-0.780303928520852,0.282452321514352,-0.796879712332893,1.29473131933939,TRUE,0.747070590343567,0.747070590343567,0.0882102579855397,0.164719151670894
548
+"P15650",1,-0.795880206848633,0.231616172526001,-0.755589451913106,1.31985348623574,TRUE,0.748470748254799,0.748470748254799,0.0889665830855374,0.162562668659664
549
+"Q68FY0",1,-1.07770605707768,0.168151034020481,-0.38087484271676,1.29042986577396,TRUE,0.753671853175602,0.753671853175602,0.0932291973257366,0.153098949498661
550
+"Q6P0K8",1,-1.09670520689619,0.616617043561968,-0.566733083499606,1.04682124683382,TRUE,0.755692710199101,0.755692710199101,0.0865487283981016,0.157758561402797
551
+"Q920F5",1,-1.17357998389218,0.448620496352072,-0.398659712037238,1.12361919957735,TRUE,0.757900529489086,0.757900529489086,0.0900822969902767,0.152017173520637
552
+"P00507",1,-0.988825868867648,0.135902190809088,-0.479080704227237,1.3320043822858,TRUE,0.759934646798179,0.759934646798179,0.0896547296743378,0.150410623527483
553
+"P14668",1,-1.19001824400734,0.38551037015185,-0.343273350932101,1.14778122478759,TRUE,0.763971627702383,0.763971627702383,0.0876371315342393,0.148391240763378
554
+"Q9ER34",1,-0.826115827202921,0.273788106989528,-0.746098277815338,1.29842599802873,TRUE,0.764419560034589,0.764419560034589,0.0831099791870808,0.152470460778331
555
+"A1A5Q0",1,-1.15039305531266,0.294449607372259,-0.354196945170504,1.2101403931109,TRUE,0.765742429143444,0.765742429143444,0.0878572187676782,0.146400352088878
556
+"P20788",1,-0.867043308597393,0.463158767971533,-0.786024959808923,1.18990950043478,TRUE,0.765973010201243,0.765973010201243,0.0808752071811913,0.153151782617566
557
+"Q01205",1,-1.1418561185172,0.30732882492016,-0.374410432636578,1.20893772623362,TRUE,0.76774322498553,0.76774322498553,0.0871282141775032,0.145128560836967
558
+"P35565",1,-0.924063565928439,0.538126552980134,-0.750973401198032,1.13691041414634,TRUE,0.767777027772252,0.767777027772252,0.0801555161821764,0.152067456045572
559
+"Q64428",1,-0.995014709681899,0.512494273654496,-0.66175760058014,1.14427803660754,TRUE,0.768870870347575,0.768870870347575,0.0833230675035789,0.147806062148846
560
+"Q5PPN7",1,-1.1399977600744,0.44750348420923,-0.447595282700421,1.14008955856559,TRUE,0.772427748517086,0.772427748517086,0.0840572777041391,0.143514973778775
561
+"P07483",1,-0.941244361708913,0.175625021524125,-0.563268660790767,1.32888800097556,TRUE,0.773072545830164,0.773072545830164,0.0833790513798236,0.143548402790012
562
+"P14408",1,-1.05472822852825,0.209921395148996,-0.439754364387074,1.28456119776633,TRUE,0.777471538401181,0.777471538401181,0.0828914985847449,0.139636963014074
563
+"P11442",1,-1.14678650384945,0.383625692534224,-0.407882966087002,1.17104377740222,TRUE,0.777601009362301,0.777601009362301,0.0823550470572957,0.140043943580403
564
+"Q68FR6",1,-1.06320516670404,0.540783469003295,-0.587519319705086,1.10994101740583,TRUE,0.779145723786152,0.779145723786152,0.0788587507499135,0.141995525463935
565
+"P11030",1,-0.87803698546107,0.271649583450281,-0.689631740679857,1.29601914269065,TRUE,0.779700067419451,0.779700067419451,0.0787622684011555,0.141537664179394
566
+"Q5XIH7",1,-1.04514420128843,0.489647485054176,-0.592202973285894,1.14769968952015,TRUE,0.780371693739696,0.780371693739696,0.079812590715155,0.139815715545149
567
+"P23965",1,-1.08508509529279,0.448995249361606,-0.52418083536045,1.16027068129164,TRUE,0.783961730835237,0.783961730835237,0.0793275021515085,0.136710767013255
568
+"P61983",1,-1.03858003819239,0.5232515943483,-0.612616643880163,1.12794508772425,TRUE,0.784072803416778,0.784072803416778,0.0769995008400447,0.138927695743177
569
+"P48500",1,-0.927532600372658,0.467907896730675,-0.722846569651962,1.18247127329394,TRUE,0.784466048064826,0.784466048064826,0.0754980064707537,0.14003594546442
570
+"Q641Z6",1,-1.05037119200368,0.23689913728425,-0.462093865616469,1.2755659203359,TRUE,0.792661917864535,0.792661917864535,0.0763165520385429,0.131021530096922
571
+"P35435",1,-1.06792226947819,0.326731224779647,-0.489086584808912,1.23027762950746,TRUE,0.793793338044438,0.793793338044438,0.0761689608411995,0.130037701114362
572
+"P13803",1,-0.975020115662053,0.452729931055493,-0.662970123758188,1.18526030836475,TRUE,0.794576032374084,0.794576032374084,0.0731426067365389,0.132281360889377
573
+"P48675",1,-0.939820758372308,0.338242965719301,-0.65351208291623,1.25508987556924,TRUE,0.801347721777241,0.801347721777241,0.0710591830629953,0.127593095159764
574
+"Q68FU3",1,-0.980730200900234,0.385564309938494,-0.627727061236256,1.222892952198,TRUE,0.806153263154184,0.806153263154184,0.0695228928476501,0.124323843998165
575
+"Q62920",1,-1.08890601213291,0.414426871184063,-0.50391232109862,1.17839146204747,TRUE,0.811576010370566,0.811576010370566,0.0676218830428914,0.120802106586543
0 576
new file mode 100644
... ...
@@ -0,0 +1,575 @@
1
+"","cluster","Mean.of.log.A","Mean.of.log.B","Mean.of.log.C","Mean.of.log.D","isClusterMember","maxMembership","membership.of.cluster.1","membership.of.cluster.2","membership.of.cluster.3"
2
+"Q9WTT7",1,-1.22255561673122,0.776823490992555,0.856334477189782,-0.410602351451118,FALSE,0.341415987556176,0.341415987556176,0.319683327322528,0.338900685121296
3
+"P63102",3,-1.09658973936807,0.830429584823418,0.865356334646909,-0.599196180102253,FALSE,0.343229407384444,0.319457954925943,0.337312637689613,0.343229407384444
4
+"Q7M0E3",1,-0.237751535202779,-1.30795600637204,0.634796914993558,0.910910626581266,FALSE,0.344393821788661,0.344393821788661,0.335649789867051,0.319956388344288
5
+"P62959",3,-1.11147501524251,0.921737797086268,0.764578478326509,-0.57484126017027,FALSE,0.348010132577035,0.326623472166496,0.325366395256469,0.348010132577035
6
+"P05765",3,-1.07423589883272,0.941039458988321,0.756377650063607,-0.623181210219205,FALSE,0.349666740832962,0.321265159140641,0.329068100026397,0.349666740832962
7
+"P02564",1,-1.29124213047911,0.407225819378061,1.06495216321144,-0.180935852110383,FALSE,0.350951066464632,0.350951066464632,0.325892731207173,0.323156202328194
8
+"P70567",3,-1.17907291834308,1.1033623798076,0.479167216325917,-0.403456677790437,FALSE,0.356513938190501,0.356288572027808,0.287197489781692,0.356513938190501
9
+"P62859",3,-1.11086660411474,1.10454447503702,0.52562489384656,-0.519302764768848,FALSE,0.359181992493911,0.340220278531354,0.300597728974735,0.359181992493911
10
+"P11960",3,0.768286653302108,-1.37327190516234,-0.110336827576684,0.715322079436916,FALSE,0.359418657747241,0.288060374504428,0.352520967748331,0.359418657747241
11
+"O35244",3,-0.942600836699279,1.07903247663846,0.616578229663232,-0.753009869602413,FALSE,0.361135617791712,0.309264943938827,0.329599438269461,0.361135617791712
12
+"P15865",3,0.845317841399481,-1.3509015407395,-0.155065561516922,0.660649260856937,FALSE,0.36243417855839,0.281614768847941,0.355951052593669,0.36243417855839
13
+"Q4V8H8",2,-0.990376331329471,-0.511646859134656,1.31196408053452,0.19005910992961,FALSE,0.364689364205571,0.330936323585115,0.364689364205571,0.304374312209314
14
+"Q641Y2",2,-0.658721981942087,1.04056760490572,0.648839467451583,-1.03068509041521,FALSE,0.365353914273232,0.274882566338248,0.365353914273232,0.35976351938852
15
+"Q00715",1,-0.975486617619047,-0.704959089890594,1.10433424359156,0.57611146391808,FALSE,0.366444738318515,0.366444738318515,0.328587197678198,0.304968064003287
16
+"Q5M9I5",1,-0.398721199682967,-1.20991980266353,0.600295332589979,1.00834566975651,FALSE,0.366701246030216,0.366701246030216,0.315516918986073,0.317781834983711
17
+"P18422",3,0.587017403091773,-1.26481732298012,-0.303727981502697,0.981527901391041,FALSE,0.367764497200928,0.322491022321984,0.309744480477088,0.367764497200928
18
+"P29410",1,0.283514062509728,-1.12256801478956,-0.389007210246928,1.22806116252676,FALSE,0.368961798686374,0.368961798686374,0.273465511161736,0.35757269015189
19
+"P09456",1,-1.34882690856007,0.633020500223665,0.869646113221733,-0.15383970488533,FALSE,0.369106602137418,0.369106602137418,0.301797595937083,0.329095801925499
20
+"A7VJC2",2,0.042521075344945,-1.4277086802381,0.677304391903939,0.707883212989214,FALSE,0.373859427139482,0.306592120934062,0.373859427139482,0.319548451926456
21
+"P10111",1,-1.36070277118647,0.662923511492294,0.831368872284789,-0.133589612590614,FALSE,0.37427114874652,0.37427114874652,0.296311202080919,0.329417649172561
22
+"P97584",1,0.273803667752207,-1.08041827100116,-0.442982941768729,1.24959754501768,FALSE,0.37450847237073,0.37450847237073,0.266895006896268,0.358596520733002
23
+"P18421",2,-0.440627912416783,1.08405540743566,0.521989827727627,-1.1654173227465,FALSE,0.375125469411083,0.25779926622384,0.375125469411083,0.367075264365078
24
+"Q04462",1,0.252472592963566,-1.08498771672392,-0.424134765760787,1.25664988952114,FALSE,0.376642558576854,0.376642558576854,0.266277528230752,0.357079913192394
25
+"Q66HF1",3,-0.662154669272374,1.21595063242532,0.404890207329366,-0.958686170482312,FALSE,0.378121632703481,0.285942189518255,0.335936177778264,0.378121632703481
26
+"P17074",3,-0.813618258900014,1.25221104136928,0.361139230622043,-0.799732013091312,FALSE,0.378537175209471,0.306188675404199,0.315274149386331,0.378537175209471
27
+"P84817",3,1.27805083523467,-1.07119723048097,-0.417853541909344,0.210999937155639,FALSE,0.379998180974301,0.243686770632053,0.376315048393646,0.379998180974301
28
+"P36953",2,-1.04471145516165,0.0369296695476287,1.34037224682916,-0.332590461215135,FALSE,0.38211604295578,0.305993586323728,0.38211604295578,0.311890370720492
29
+"P29147",3,0.95994417584446,-1.19225678544614,-0.445112954347543,0.677425563949227,FALSE,0.38260962702548,0.284323753186112,0.333066619788408,0.38260962702548
30
+"Q80W89",1,-1.38860650766364,0.62745796325888,0.821252679826623,-0.0601041354218674,FALSE,0.382665384205258,0.382665384205258,0.290819987446839,0.326514628347903
31
+"P49134",3,-0.967114563069212,1.36650763374215,0.0427791298065462,-0.442172200479485,FALSE,0.38306620073057,0.351558471187871,0.265375328081559,0.38306620073057
32
+"P52481",3,1.07812861879728,-1.17922044752121,-0.419543459353691,0.520635288077625,FALSE,0.384117544073984,0.265468936318555,0.350413519607461,0.384117544073984
33
+"P02262",3,0.577205983689815,-0.966365457057812,-0.715708269372901,1.1048677427409,FALSE,0.384796945293093,0.345920498249342,0.269282556457565,0.384796945293093
34
+"P31044",3,0.518125805339752,-0.885899999569846,-0.785416238181077,1.15319043241117,FALSE,0.386007570839718,0.357733372976445,0.256259056183837,0.386007570839718
35
+"P21670",3,0.806086873086992,-1.15745324851011,-0.513082652636684,0.864449028059801,FALSE,0.386023487255008,0.30546063017328,0.308515882571712,0.386023487255008
36
+"Q66HG9",3,0.528687527373817,-0.899407350936142,-0.774546156980346,1.14526598054267,FALSE,0.386871171680699,0.355966211448957,0.257162616870344,0.386871171680699
37
+"P11598",1,0.301084560576599,-0.913710960535612,-0.664980992069462,1.27760739202847,FALSE,0.387205384416985,0.387205384416985,0.245210285650589,0.367584329932426
38
+"P62755",3,-0.0389407975291494,1.13744489013407,0.192821775989106,-1.29132586859402,FALSE,0.387926021655883,0.237317007997147,0.37475697034697,0.387926021655883
39
+"Q5XIB3",1,-0.974203733132857,1.39661954883484,-0.285918554631725,-0.136497261070257,FALSE,0.390252642946311,0.390252642946311,0.22973164607871,0.380015710974979
40
+"Q561S0",2,-0.29195595563046,1.03974319256994,0.507611610559439,-1.25539884749892,FALSE,0.390551257779753,0.245513504103172,0.390551257779753,0.363935238117075
41
+"Q9Z327",3,1.4238473495347,-0.822864036512246,-0.540244687119878,-0.0607386259025733,FALSE,0.391669953232288,0.226000728921184,0.382329317846528,0.391669953232288
42
+"P21533",1,-1.1610071004706,1.27175679625698,0.064133344864941,-0.174883040651325,FALSE,0.392941186544267,0.392941186544267,0.244728988004819,0.362329825450914
43
+"P11661",3,1.01400127654449,-1.09525294190164,-0.579423152426748,0.660674817783897,FALSE,0.395216159513807,0.28191633628787,0.322867504198323,0.395216159513807
44
+"A0JPQ4",3,-0.798153063530559,1.41456579991769,-0.0149718595747129,-0.601440876812416,FALSE,0.395613290806538,0.327971588005328,0.276415121188134,0.395613290806538
45
+"P26453",1,-0.928217175921058,1.40351004597353,-0.404410893192759,-0.0708819768597153,FALSE,0.395839829203858,0.395839829203858,0.222425391144816,0.381734779651326
46
+"P50463",1,-0.927625902520372,1.40167652612515,-0.413732844484173,-0.0603177791206025,FALSE,0.396572471137131,0.396572471137131,0.222576359480423,0.380851169382445
47
+"Q642A4",1,-0.990567498090708,1.3838391627856,-0.311600831676004,-0.0816708330188833,FALSE,0.399384029713076,0.399384029713076,0.224015963969218,0.376600006317705
48
+"Q4V8F9",3,-0.735389850308153,1.42648327512408,-0.650130176291942,-0.0409632485239869,FALSE,0.400070425828875,0.384895813705729,0.215033760465396,0.400070425828875
49
+"P05197",3,-0.806680466134843,1.4533670266097,-0.441430446709359,-0.205256113765502,FALSE,0.400232001541973,0.371424893595231,0.228343104862796,0.400232001541973
50
+"P85968",3,-0.670588273110441,1.37506139632225,-0.805765134932413,0.101292011720603,FALSE,0.400677025766049,0.399130561838571,0.20019241239538,0.400677025766049
51
+"P63159",3,1.06262914289487,-1.01249703502632,-0.674840031796486,0.624707923927939,FALSE,0.401626035478914,0.28078721121108,0.317586753310006,0.401626035478914
52
+"P05503",1,-1.37323640326891,0.955518608862908,0.447565716305493,-0.0298479218994934,FALSE,0.402169713489256,0.402169713489256,0.262597723503985,0.335232563006758
53
+"P63031",3,1.49135080000615,-0.533609962008834,-0.606344815216201,-0.351396022781113,FALSE,0.402369476952672,0.208102508857831,0.389528014189497,0.402369476952672
54
+"P16290",1,0.276918870971871,-0.0851212638009298,-1.29957590901914,1.1077783018482,FALSE,0.402558999192463,0.402558999192463,0.1962990572961,0.401141943511437
55
+"Q8CG45",3,1.47145046115324,-0.624139144658676,-0.631400254984229,-0.21591106151033,FALSE,0.403371149681465,0.218425465413795,0.37820338490474,0.403371149681465
56
+"O08730",3,1.31416497032711,0.188825682305777,-0.519304842536431,-0.983685810096455,FALSE,0.404860823723889,0.193644569838227,0.401494606437885,0.404860823723889
57
+"O35567",1,-0.0794176151699813,-1.10234583661795,-0.144048226856943,1.32581167864488,FALSE,0.405610503820894,0.405610503820894,0.26067288803811,0.333716608140997
58
+"Q9Z2L0",3,0.657315623928304,-0.707989738599222,-0.990882103975011,1.04155621864593,FALSE,0.406012306884621,0.342531733454857,0.251455959660522,0.406012306884621
59
+"P69897",3,1.45289065868013,-0.680451397169984,-0.638967947908986,-0.133471313601158,FALSE,0.406596440346303,0.219287109676554,0.374116449977142,0.406596440346303
60
+"P84100",3,1.09399813885662,0.49619439153139,-0.412602437701228,-1.17759009268678,FALSE,0.40710723962451,0.191302580732816,0.401590179642674,0.40710723962451
61
+"Q63362",3,0.724123291047497,0.841146682965716,-0.261538704480694,-1.30373126953252,FALSE,0.407231549913556,0.206864572171669,0.385903877914775,0.407231549913556
62
+"Q5U2X7",3,0.483365463231436,-0.395542825484475,-1.18541193085588,1.09758929310892,FALSE,0.408055277996566,0.369824474429788,0.222120247573645,0.408055277996566
63
+"Q925F0",3,0.938465018048178,-0.908394733983895,-0.819289550219721,0.789219266155438,FALSE,0.4087647102927,0.300675849655922,0.290559440051378,0.4087647102927
64
+"A2RRU1",2,1.42513530027703,-0.891863820107753,-0.391893607115268,-0.141377873054013,FALSE,0.408949606725845,0.216771517423844,0.408949606725845,0.374278875850311
65
+"P97521",1,-1.22745452042076,1.21876589866509,0.0673019890263837,-0.0586133672707044,FALSE,0.409124232584001,0.409124232584001,0.239399770725326,0.351475996690673
66
+"A2VD12",1,0.216387517496557,-0.735341273088526,-0.807714097180547,1.32666785277252,FALSE,0.409261688886282,0.409261688886282,0.226699232692424,0.364039078421294
67
+"P29266",3,0.750866432895612,0.820549850273136,-0.271790358440313,-1.29962592472843,FALSE,0.409332757446969,0.202103085574015,0.388564156979016,0.409332757446969
68
+"P47727",1,0.278093614538014,-0.410099019281359,-1.10569905628898,1.23770446103232,FALSE,0.409443027285836,0.409443027285836,0.206638392262607,0.383918580451557
69
+"P35281",2,1.23436122770519,0.297701702767411,-0.438833020677535,-1.09322990979507,FALSE,0.409649036519576,0.192500805264641,0.409649036519576,0.397850158215783
70
+"P03889",3,0.719762247170447,0.855381381699331,-0.282732100463333,-1.29241152840645,FALSE,0.409933284707646,0.208756347059276,0.381310368233078,0.409933284707646
71
+"P30427",1,-0.0997799682730416,-1.09555903734175,-0.135602849207248,1.33094185482204,FALSE,0.410066366081408,0.410066366081408,0.257698687947313,0.33223494597128
72
+"P62832",2,0.868105928023184,0.677624501556055,-0.228541849427491,-1.31718858015175,FALSE,0.410701412223703,0.19564862463855,0.410701412223703,0.393649963137746
73
+"Q920L2",2,0.849139095726594,-1.44475511332672,0.213350213381282,0.382265804218844,FALSE,0.41071764711444,0.254312020135816,0.41071764711444,0.334970332749744
74
+"P52504",2,0.517196670869277,0.871657068685931,0.0155957366629745,-1.40444947621818,FALSE,0.410766222269675,0.208477469878814,0.410766222269675,0.380756307851511
75
+"Q5BK63",2,-0.455949953851938,0.853808422374985,0.797056492788871,-1.19491496131192,FALSE,0.411392922365605,0.246528967596255,0.411392922365605,0.34207811003814
76
+"Q5XIF3",3,-0.686652950476595,1.46861271027439,-0.209384312977792,-0.572575446820001,FALSE,0.411901311550702,0.325168248040646,0.262930440408653,0.411901311550702
77
+"P0C1X8",2,1.26156448337688,0.258704159268722,-0.455241849003986,-1.06502679364161,FALSE,0.411952247971367,0.187439249504713,0.411952247971367,0.40060850252392
78
+"P04041",2,-0.89616725763667,0.114745832657532,1.359836070356,-0.578414645376864,FALSE,0.413029372986226,0.278730815615242,0.413029372986226,0.308239811398533
79
+"Q505J9",1,0.219255643045472,-0.0307072213378385,-1.30530863973811,1.11676021803047,FALSE,0.4130656718251,0.4130656718251,0.191220529240442,0.395713798934458
80
+"P62246",2,0.484040352017557,0.884437145960691,0.0393324435093142,-1.40780994148756,FALSE,0.414034869923982,0.204766884821877,0.414034869923982,0.381198245254141
81
+"Q5XI32",3,0.651412122615601,0.920285644805855,-0.289049305200988,-1.28264846222047,FALSE,0.414955765000669,0.212124416220053,0.372919818779277,0.414955765000669
82
+"P24473",3,0.152635238138068,0.345977209942306,-1.41821491756349,0.919602469483118,FALSE,0.415213979504315,0.40328748244256,0.181498538053125,0.415213979504315
83
+"P04642",2,0.20410079310017,0.947278036467618,0.260423790258789,-1.41180261982658,FALSE,0.415226327991734,0.216349228914373,0.415226327991734,0.368424443093892
84
+"P28042",3,-0.345496218280398,1.13256573262833,-1.19608943263915,0.409019918291224,FALSE,0.416749513695259,0.407336691853842,0.175913794450898,0.416749513695259
85
+"P11980",3,0.372565811413721,-0.0700343380101918,-1.3367038965113,1.03417242310777,FALSE,0.417212905349766,0.382390232847368,0.200396861802866,0.417212905349766
86
+"P07895",3,0.186338549751249,0.306350378860213,-1.41896038609356,0.9262714574821,FALSE,0.417576461511771,0.398779601936791,0.183643936551438,0.417576461511771
87
+"Q63617",2,0.222054472732967,0.927367280055935,0.27089439680599,-1.42031614959489,FALSE,0.418553063835832,0.215721482848211,0.418553063835832,0.365725453315956
88
+"O88989",3,1.31147261726968,-0.789297075492299,-0.771340675121424,0.249165133344046,FALSE,0.418569518909246,0.248016494609653,0.333413986481101,0.418569518909246
89
+"P20070",2,-0.191187100684764,-1.26027754640786,1.12683903482903,0.324625612263595,FALSE,0.418903017077252,0.281156530159436,0.418903017077252,0.299940452763313
90
+"P11951",1,-1.3338251265102,1.07618450897424,0.250368839470242,0.00727177806572177,FALSE,0.419445483158996,0.419445483158996,0.242098922178137,0.338455594662866
91
+"O35094",3,-0.559064156125634,1.47833051977834,-0.260308296330563,-0.658958067322138,FALSE,0.420231067304555,0.310702436825026,0.26906649587042,0.420231067304555
92
+"P19234",2,-0.238156280128961,0.891942444475275,0.656469030080836,-1.31025519442715,FALSE,0.420371228818079,0.233200829150171,0.420371228818079,0.34642794203175
93
+"P31211",2,-0.827431958207961,-0.314874259283705,1.45539821280822,-0.313091995316558,FALSE,0.420652281330759,0.280969203035348,0.420652281330759,0.298378515633893
94
+"P19945",1,-0.828327352557475,-0.880047244076799,0.654038898391862,1.05433569824241,FALSE,0.420704348171406,0.420704348171406,0.277510306242954,0.30178534558564
95
+"P12368",2,1.29099592677473,0.180253377604296,-0.405056218203893,-1.06619308617513,FALSE,0.422173847360457,0.190710033507947,0.422173847360457,0.387116119131596
96
+"Q99J82",3,1.09036734729641,0.544325182035761,-0.518432137010402,-1.11626039232177,FALSE,0.423308649645239,0.197515555618414,0.379175794736347,0.423308649645239
97
+"P84245",2,-0.406534605662114,-1.06526978216782,1.29125155584021,0.180552831989725,FALSE,0.423333151046353,0.281266061591213,0.423333151046353,0.295400787362434
98
+"P17764",1,-0.135198790129031,0.794532316434377,-1.36240083730583,0.703067311000481,FALSE,0.423334915437978,0.423334915437978,0.165135780937212,0.411529303624809
99
+"Q6P6V0",3,-0.519741286507428,1.40312411993121,-0.872347360577147,-0.0110354728466381,FALSE,0.424085058599631,0.369588615860726,0.206326325539643,0.424085058599631
100
+"P60901",2,0.999758449581309,0.532449670126365,-0.244975702237386,-1.28723241747029,FALSE,0.424637457930446,0.189415753203039,0.424637457930446,0.385946788866515
101
+"P26284",3,-0.552048731231546,1.4596723736184,-0.730134478544469,-0.177489163842383,FALSE,0.424964992254096,0.354081673980561,0.220953333765343,0.424964992254096
102
+"P02770",2,-0.676270590076743,-0.684859536878106,1.43795792471005,-0.0768277977552051,FALSE,0.425452713848325,0.280820422104479,0.425452713848325,0.293726864047196
103
+"P47942",2,0.0244119384073626,-1.37315030453493,0.9939898240482,0.354748542079372,FALSE,0.425458664227177,0.272536788558097,0.425458664227177,0.302004547214725
104
+"Q64536",1,-1.24867078177144,1.19984543131461,0.0247748078984623,0.0240505425583701,FALSE,0.425672009603102,0.425672009603102,0.228456715915766,0.345871274481133
105
+"Q9ER30",3,0.82354919357449,0.822758894481269,-0.442582521895795,-1.20372556615996,FALSE,0.425883498460239,0.20984553273604,0.364270968803722,0.425883498460239
106
+"Q63638",3,0.615481757279154,-0.424605848803438,-1.19604580297424,1.00516989449853,FALSE,0.426274455333331,0.348627310740133,0.225098233926536,0.426274455333331
107
+"P63255",2,-0.507323103447376,0.693138730723931,0.966553899924051,-1.15236952720061,FALSE,0.426700936352963,0.245169039789662,0.426700936352963,0.328130023857375
108
+"P68136",1,-0.723198133334644,1.31414364868263,-0.831850716539498,0.240905201191517,FALSE,0.427024603990206,0.427024603990206,0.189134203580408,0.383841192429386
109
+"Q68FQ0",3,1.44245405902461,-0.10230459762413,-0.743762475483122,-0.596386985917363,FALSE,0.427433079473034,0.205870395693444,0.366696524833522,0.427433079473034
110
+"Q63159",2,-0.130838896665075,-1.27672199487876,1.12936727546149,0.278193616082341,FALSE,0.42773799678585,0.27411924100721,0.42773799678585,0.29814276220694
111
+"Q5BK81",1,-0.254565008206742,0.937158477241225,-1.29627414868664,0.613680679652157,FALSE,0.427949870196411,0.427949870196411,0.166246614437651,0.405803515365937
112
+"P62909",3,-0.503572307087162,1.49330088180059,-0.379352205420729,-0.610376369292696,FALSE,0.428492545208137,0.311331521681172,0.260175933110691,0.428492545208137
113
+"P85972",3,-0.131208127839539,1.38375864101433,-0.249741687977783,-1.00280882519701,FALSE,0.428515003749483,0.265280698041849,0.306204298208667,0.428515003749483
114
+"Q8VBU2",3,1.28786954342104,-0.705845774941151,-0.871441874673088,0.289418106193196,FALSE,0.428945169948752,0.252676078590262,0.318378751460986,0.428945169948752
115
+"B2RYW9",3,1.46113771367313,-0.228345988802215,-0.779256190055297,-0.453535534815621,FALSE,0.429390899424785,0.210693387095694,0.359915713479521,0.429390899424785
116
+"P62278",3,1.2816891397975,0.29733937581988,-0.684165508538103,-0.894863007079282,FALSE,0.429842177079618,0.204765491741887,0.365392331178495,0.429842177079618
117
+"Q9NQR8",3,-0.10744274387748,0.959313640238656,-1.34933443681078,0.497463540449608,FALSE,0.431062107154207,0.38347322252332,0.185464670322473,0.431062107154207
118
+"P07633",1,-0.123189043717616,-0.958574743351368,-0.319598343138577,1.40136213020756,FALSE,0.431683438738634,0.431683438738634,0.23823378636573,0.330082774895636
119
+"Q09073",3,-0.354854418232648,1.30594113195523,-1.07400519073979,0.122918477017206,FALSE,0.432315930653423,0.367276373718448,0.200407695628129,0.432315930653423
120
+"Q6AXS5",2,-0.0734213683397524,0.875268942905072,0.57555811573419,-1.37740569029951,FALSE,0.432923824043341,0.220663445357635,0.432923824043341,0.346412730599024
121
+"O35854",2,0.56501459940382,-1.48672793406183,0.611887817919841,0.30982551673817,FALSE,0.434194962076003,0.253226688800409,0.434194962076003,0.312578349123588
122
+"P36972",2,1.3113962630322,0.117479672727169,-0.36401312008419,-1.06486281567518,FALSE,0.434689278386351,0.186468227108345,0.434689278386351,0.378842494505304
123
+"P09812",2,0.521983767702376,0.793565524030845,0.127225906946887,-1.44277519868011,FALSE,0.434908049827266,0.200105548761383,0.434908049827266,0.364986401411351
124
+"Q5I0G4",3,-0.462478175903775,1.45957722939435,-0.780192019109558,-0.216907034381021,FALSE,0.435567232499199,0.342546153053137,0.221886614447664,0.435567232499199
125
+"Q9QZ76",1,0.136490781795837,-0.389930970855571,-1.05590582682842,1.30934601588815,FALSE,0.435889531832078,0.435889531832078,0.199859009187837,0.364251458980085
126
+"Q3T1J1",2,0.133852908035827,-1.39670067734223,0.973416847081542,0.289430922224862,FALSE,0.436289878399728,0.263344077741305,0.436289878399728,0.300366043858967
127
+"Q8CFN2",3,1.31692765310314,0.236327759687733,-0.734499581519243,-0.818755831271628,FALSE,0.436466654476098,0.203981577643363,0.359551767880538,0.436466654476098
128
+"P01048",2,-0.234854167949298,-1.16404835271534,1.25233950454475,0.146563016119883,FALSE,0.436610049279776,0.26971758915768,0.436610049279776,0.293672361562544
129
+"P14942",2,0.336376881504514,-1.46055795663105,0.808798364835442,0.31538271029109,FALSE,0.437042222493057,0.257879779755254,0.437042222493057,0.30507799775169
130
+"P70615",2,-0.640979130536403,0.432830626234847,1.19497766292747,-0.986829158625919,FALSE,0.437456588040678,0.24953760121526,0.437456588040678,0.313005810744062
131
+"P07632",2,0.856061508446359,0.604419080876901,-0.0839684894072711,-1.37651209991599,FALSE,0.437759074930443,0.191667913146927,0.437759074930443,0.37057301192263
132
+"O35987",3,1.23078203578623,-0.590533116303904,-1.00257844334928,0.362329523866952,FALSE,0.437833558738119,0.263168920616429,0.298997520645452,0.437833558738119
133
+"P28023",2,1.38354195947944,-1.00752242593757,-0.190735825292979,-0.185283708248888,FALSE,0.43832852277013,0.211173134460401,0.43832852277013,0.350498342769469
134
+"P50503",2,0.395563731917972,0.818380032248664,0.240658262947011,-1.45460202711365,FALSE,0.438434668969954,0.203544016191541,0.438434668969954,0.358021314838505
135
+"Q63377",2,0.694862044662732,0.705903448302105,0.0199626836487842,-1.42072817661362,FALSE,0.438719853643409,0.193546659409406,0.438719853643409,0.367733486947185
136
+"Q68FR9",3,0.90059753273327,0.785676656182459,-0.569389075412065,-1.11688511350366,FALSE,0.439254269426345,0.210513225861636,0.350232504712019,0.439254269426345
137
+"Q9Z270",3,1.30913657253346,-0.557502829597966,-0.964406451602326,0.212772708666834,FALSE,0.439304106592995,0.25023863513459,0.310457258272414,0.439304106592995
138
+"Q9R1Z0",3,0.788607483780401,-0.403282914781419,-1.22736601393943,0.842041444940444,FALSE,0.439477847217772,0.320508359982624,0.240013792799603,0.439477847217772
139
+"P97700",3,-0.426712462367446,1.42728412175252,-0.874588305954145,-0.12598335343093,FALSE,0.440071824986839,0.34821867963686,0.211709495376301,0.440071824986839
140
+"P51650",1,-1.4585861305481,0.762822450486972,0.50374212932785,0.192021550733279,FALSE,0.440145434101177,0.440145434101177,0.24306797866005,0.316786587238773
141
+"P04692",3,0.524222962694514,-0.0673417395369392,-1.3721812179802,0.915299994822626,FALSE,0.440356357001573,0.352814949438903,0.206828693559524,0.440356357001573
142
+"Q63416",2,-0.28212840642109,-1.1120391858465,1.29370795495053,0.100459637317061,FALSE,0.440724464680309,0.267686622142989,0.440724464680309,0.291588913176703
143
+"P16617",3,1.44150893865508,-0.227663629122814,-0.865293545169259,-0.348551764363002,FALSE,0.440912692967963,0.216329699375631,0.342757607656406,0.440912692967963
144
+"B1PRL5",1,-0.598624199641864,1.2168847923014,-1.00544825159549,0.387187658935953,FALSE,0.440916993642802,0.440916993642802,0.173643867662874,0.385439138694324
145
+"Q71LX6",3,1.38185932450224,-0.421500227695758,-0.955394009425395,-0.00496508738108957,FALSE,0.441517903808003,0.237936464587999,0.320545631603998,0.441517903808003
146
+"Q63355",3,1.39227254303094,-0.458228086993823,-0.922754969482947,-0.0112894865541733,FALSE,0.441562067510939,0.23348771398289,0.324950218506171,0.441562067510939
147
+"P08050",1,-0.978378067259696,1.31207002382211,-0.531245106405444,0.197553149843033,FALSE,0.442130447440584,0.442130447440584,0.198983996354038,0.358885556205378
148
+"P97576",3,-0.41524343848193,1.45575237198778,-0.809242786496914,-0.231266147008938,FALSE,0.442156177970204,0.337030739007131,0.220813083022665,0.442156177970204
149
+"P43278",1,-0.963887213220377,-0.728990950287461,0.615597798240325,1.07728036526751,FALSE,0.442597282841794,0.442597282841794,0.261571992714094,0.295830724444112
150
+"P63088",3,0.934382364507242,0.756314980122834,-0.594661125585992,-1.09603621904408,FALSE,0.442598705149738,0.20822999171031,0.349171303139952,0.442598705149738
151
+"Q5XIE6",3,-0.0131078844840037,0.86943634098686,-1.39699326880179,0.540664812298929,FALSE,0.443154475779794,0.378139911857874,0.178705612362332,0.443154475779794
152
+"P0C219",1,-1.13701153338653,1.27059721987052,-0.271566999309857,0.137981312825867,FALSE,0.443233331261414,0.443233331261414,0.20829648653921,0.348470182199376
153
+"P16086",3,0.619749276032991,1.02406388373118,-0.493164169485221,-1.15064899027895,FALSE,0.443775098350284,0.219857099460647,0.336367802189069,0.443775098350284
154
+"P02091",2,0.338914789154833,-1.45270270342468,0.834859658407572,0.278928255862271,FALSE,0.443993290448225,0.253688464678143,0.443993290448225,0.302318244873632
155
+"P22062",3,1.14657519362804,-0.53258482332431,-1.08584903662484,0.471858666321115,FALSE,0.444699557211299,0.273061632926992,0.282238809861709,0.444699557211299
156
+"P00564",1,0.0697923341499883,-0.5303866931005,-0.911575274901173,1.37216963385168,FALSE,0.444785599919356,0.444785599919356,0.203955182387031,0.351259217693613
157
+"P09605",1,-0.323820337210932,-0.93316928265902,-0.157101787206282,1.41409140707623,FALSE,0.444886046352273,0.444886046352273,0.238473272368344,0.316640681279383
158
+"Q9WU82",3,0.997586224122385,0.697510786382722,-0.645529334368543,-1.04956767613656,FALSE,0.446032069153846,0.207578075515921,0.346389855330233,0.446032069153846
159
+"P51868",2,-0.723653157350259,-0.0748389075157923,1.43653347016468,-0.638041405298633,FALSE,0.447013005390373,0.257101794394191,0.447013005390373,0.295885200215435
160
+"P09650",2,0.155209512015489,-1.39151144105516,0.989220154105079,0.247081774934592,FALSE,0.447299068794503,0.256075584807806,0.447299068794503,0.29662534639769
161
+"Q9JK11",3,1.2227388271462,-0.511854447958883,-1.05908857962475,0.348204200437434,FALSE,0.447821632066814,0.261164424442121,0.291013943491065,0.447821632066814
162
+"O35763",2,0.931859432282319,0.526071491956477,-0.0996382444133528,-1.35829267982544,FALSE,0.449665022862927,0.183215056049717,0.449665022862927,0.367119921087356
163
+"P47967",2,-0.262263297400804,-1.08312695573393,1.32577111524864,0.0196191378860915,FALSE,0.449834593767406,0.261260121348389,0.449834593767406,0.288905284884205
164
+"P62961",2,-0.0420608702286597,0.769181843032893,0.671388237206508,-1.39850921001074,FALSE,0.449888839077487,0.217216483986118,0.449888839077487,0.332894676936394
165
+"Q6P502",3,-0.199521122275059,1.19863077330491,-1.21522428261858,0.216114631588723,FALSE,0.450623142390312,0.361305742018047,0.188071115591641,0.450623142390312
166
+"Q64119",2,-0.554223089772288,-0.665148226006098,1.47772407908167,-0.25835276330328,FALSE,0.451986520186968,0.260618376236523,0.451986520186968,0.287395103576509
167
+"B2GV06",1,-1.18192824376596,-0.462874308116883,0.688041155121545,0.956761396761301,FALSE,0.453339236463727,0.453339236463727,0.255171464554267,0.291489298982005
168
+"P24329",3,1.3958620723858,0.00698201191704674,-0.885180802422439,-0.517663281880403,FALSE,0.4547037237303,0.207589030021311,0.33770724624839,0.4547037237303
169
+"P49432",1,-0.94148888357518,1.286659476516,-0.618979015333235,0.273808422392411,FALSE,0.455903468652595,0.455903468652595,0.188748742193694,0.355347789153711
170
+"P18420",2,-0.49823678514149,0.469226792514345,1.1394862257753,-1.11047623314816,FALSE,0.455918661884278,0.234256415769696,0.455918661884278,0.309824922346026
171
+"Q9EPX0",3,0.733756168975377,0.968231710595509,-0.656381674004518,-1.04560620556637,FALSE,0.456465686587674,0.22185090320188,0.321683410210446,0.456465686587674
172
+"P00388",3,0.514969083728862,0.229720745753188,-1.4688743832705,0.724184553788447,FALSE,0.45755353664669,0.336173122478488,0.206273340874822,0.45755353664669
173
+"P02563",1,-0.0268127992003775,-0.583794186585127,-0.806461989563737,1.41706897534924,FALSE,0.457736112006961,0.457736112006961,0.204090274304414,0.338173613688625
174
+"Q497B0",1,-1.49634960166187,0.546496270632869,0.549656246529284,0.400197084499716,FALSE,0.457755456758377,0.457755456758377,0.23898882811037,0.303255715131253
175
+"P27605",1,-1.00863580265014,1.28602590868172,-0.51969278552188,0.242302679490303,FALSE,0.457818211856904,0.457818211856904,0.190710130931837,0.351471657211259
176
+"Q6AY30",3,0.202489343231166,0.638563536443384,-1.46875105856131,0.627698178886762,FALSE,0.45825977051799,0.360529397315953,0.181210832166057,0.45825977051799
177
+"P62425",3,-0.191363535544085,1.24601246613443,-1.18104105071426,0.126392120123924,FALSE,0.45853367851577,0.350077383447379,0.19138893803685,0.45853367851577
178
+"P24368",1,-1.4430022988271,0.864617951322675,0.327375528183355,0.251008819321069,FALSE,0.45881615741208,0.45881615741208,0.226741666469367,0.314442176118553
179
+"Q4FZT0",3,-0.101062880755208,1.14380902298892,-1.27563676986251,0.2328906276288,FALSE,0.458856930208217,0.351482022212212,0.189661047579571,0.458856930208217
180
+"Q641Z4",3,0.293785731801982,1.26947900729869,-0.58136420987469,-0.981900529225986,FALSE,0.45960094556006,0.243635672787078,0.296763381652863,0.45960094556006
181
+"P62902",2,0.401115764156966,0.729811617110601,0.347493804659624,-1.47842118592719,FALSE,0.459765397981413,0.198393847541378,0.459765397981413,0.341840754477209
182
+"Q62871",3,0.962484821604179,-0.297392334120914,-1.27169659361495,0.606604106131684,FALSE,0.459799382381802,0.291400738116456,0.248799879501743,0.459799382381802
183
+"P0C546",3,-0.0795023719852119,1.43858518905403,-0.696847113623465,-0.66223570344535,FALSE,0.46062819965911,0.281690918877124,0.257680881463765,0.46062819965911
184
+"P62804",1,-0.504603414100624,-0.897247365161814,0.00892475504739636,1.39292602421504,FALSE,0.46144409097435,0.46144409097435,0.233945441289432,0.304610467736218
185
+"P04897",2,0.543085071588938,0.686756616838447,0.24448844854177,-1.47433013696915,FALSE,0.461727138332724,0.193242279924523,0.461727138332724,0.345030581742753
186
+"P80299",1,-0.402198266828379,0.94945407749547,-1.21888687718545,0.671631066518356,FALSE,0.461758309106382,0.461758309106382,0.163440521420695,0.374801169472924
187
+"P14669",3,0.813613811530261,0.898666695863747,-0.676587382052196,-1.03569312534181,FALSE,0.462243834221464,0.213615604439315,0.324140561339221,0.462243834221464
188
+"P63324",2,0.778820786981544,0.585460238589606,0.0662053739637651,-1.43048639953492,FALSE,0.462696514625389,0.184951025421477,0.462696514625389,0.352352459953134
189
+"Q5RKI1",3,0.970571046673791,-0.255144250833634,-1.28964030077299,0.57421350493283,FALSE,0.462977440480723,0.288901977518956,0.24812058200032,0.462977440480723
190
+"Q9EP80",1,-1.47768015573614,0.254113142835235,0.652586389022513,0.570980623878396,FALSE,0.464130594779648,0.464130594779648,0.241459892474112,0.29440951274624
191
+"P52296",3,1.06900658844428,-0.249744808240528,-1.26381398299482,0.444552202791067,FALSE,0.465598752428921,0.275681591876712,0.258719655694368,0.465598752428921
192
+"P39069",3,1.36375565813091,-0.0142224239084874,-1.01340230072908,-0.336130933493338,FALSE,0.46578436679579,0.220265213364805,0.313950419839405,0.46578436679579
193
+"P97519",3,0.530300241364083,0.253968638566871,-1.47535711943162,0.691088239500664,FALSE,0.465896111151793,0.330972322190555,0.203131566657652,0.465896111151793
194
+"Q4V8C3",1,-0.237881180454806,-0.764413941803177,-0.462383993494748,1.46467911575273,FALSE,0.46595679646795,0.46595679646795,0.216146496972218,0.317896706559833
195
+"P12749",3,0.956313917933676,0.769484222618582,-0.817247616079122,-0.908550524473136,FALSE,0.466253195463534,0.218125323133726,0.315621481402741,0.466253195463534
196
+"P01835",3,0.7931401985088,-0.098169091674018,-1.37699976781216,0.682028660977373,FALSE,0.466644609478943,0.307560380838851,0.225795009682206,0.466644609478943
197
+"P05708",3,0.663934423173226,0.102686383812382,-1.44509966164471,0.6784788546591,FALSE,0.467054267665916,0.318245967685589,0.214699764648495,0.467054267665916
198
+"P06685",3,1.23837068282774,-0.29885241435084,-1.15378325587032,0.214264987393416,FALSE,0.467387889378555,0.251468151539518,0.281143959081927,0.467387889378555
199
+"Q5M7W5",3,-0.119111695683569,1.43152243122662,-0.850299370077205,-0.46211136546585,FALSE,0.467461037820397,0.295477232143516,0.237061730036087,0.467461037820397
200
+"P82995",2,0.227873108522762,0.709255224846857,0.532916266433469,-1.47004459980309,FALSE,0.469213928235076,0.201086787082763,0.469213928235076,0.329699284682161
201
+"P08461",3,-0.100312481450952,1.30220859596137,-1.13569708419768,-0.0661990303127416,FALSE,0.469711566226948,0.322616368658383,0.20767206511467,0.469711566226948
202
+"B2RZ37",1,-0.768871365806504,1.22016864286676,-0.865254255166871,0.413956978106619,FALSE,0.469763665542646,0.469763665542646,0.171192752121806,0.359043582335548
203
+"Q63258",3,-0.022590897976474,1.41878602133826,-0.775089333105415,-0.621105790256365,FALSE,0.470067238956507,0.278960876888907,0.250971884154586,0.470067238956507
204
+"Q07803",3,0.581068542455019,0.245833264796872,-1.47647537546803,0.64957356821614,FALSE,0.470992055657361,0.322443307983818,0.206564636358822,0.470992055657361
205
+"P04797",1,-0.0350871227090812,-0.394646204325311,-0.957883928264705,1.3876172552991,FALSE,0.471502917498824,0.471502917498824,0.189860733428693,0.338636349072483
206
+"Q5SGE0",3,0.634521771705035,1.06257116815456,-0.729671723708569,-0.967421216151024,FALSE,0.471714581841498,0.226389794199007,0.301895623959495,0.471714581841498
207
+"P41350",2,0.912081265139484,0.475559919216882,0.00588523913774426,-1.39352642349411,FALSE,0.47212716041578,0.178202792888807,0.47212716041578,0.349670046695413
208
+"Q5XI78",1,-1.33718615888379,1.06819085482938,0.00273605415657945,0.266259249897831,FALSE,0.472192452187231,0.472192452187231,0.207823286362891,0.319984261449878
209
+"P18292",2,0.21592647509952,0.699674793030934,0.553304726480143,-1.4689059946106,FALSE,0.472446715159498,0.199935451772089,0.472446715159498,0.327617833068413
210
+"P29975",2,1.10918964351926,0.277930085793798,-0.0892409793006588,-1.2978787500124,FALSE,0.472937013069269,0.179478380694708,0.472937013069269,0.347584606236023
211
+"P21807",2,1.00755050479956,-1.36243020192858,0.358625009979302,-0.00374531285027488,FALSE,0.473105517484964,0.217112660830907,0.473105517484964,0.309781821684129
212
+"Q62812",1,-0.573863282897392,-0.849657553892745,0.0278170043367933,1.39570383245334,FALSE,0.473665724640811,0.473665724640811,0.227606322969658,0.298727952389531
213
+"P35745",3,0.245427297553332,0.772124161305991,-1.46425577512131,0.446704316261984,FALSE,0.473685814572132,0.33526961803039,0.191044567397478,0.473685814572132
214
+"P10760",3,0.672820866833128,1.03756531575136,-0.791711401350385,-0.918674781234098,FALSE,0.475615736658666,0.22776224913224,0.296622014209094,0.475615736658666
215
+"Q6AYH5",2,1.26295495769411,0.0660884198564188,-0.155896607850569,-1.17314676969996,FALSE,0.476632018418641,0.17826406122479,0.476632018418641,0.345103920356569
216
+"Q9WUH4",3,-0.0336824751812279,1.34252933362082,-1.06669787046599,-0.242148987973597,FALSE,0.478973238276503,0.302815286159082,0.218211475564415,0.478973238276503
217
+"Q9Z269",3,0.591584816793317,1.10202872335531,-0.82038059221885,-0.873232947929777,FALSE,0.479524149492315,0.233520456787638,0.286955393720046,0.479524149492315
218
+"Q5XIJ4",3,-0.0599735127030101,1.36722739659608,-1.0228396619972,-0.284414221895869,FALSE,0.479537839075125,0.301185968648087,0.219276192276789,0.479537839075125
219
+"P52944",1,-1.44365824616963,0.102084773359653,0.618251625094375,0.7233218477156,FALSE,0.479860405502431,0.479860405502431,0.233618288269396,0.286521306228173
220
+"Q6P9T8",1,-0.0705650788581804,-0.369115111915813,-0.95534398992083,1.39502418069482,FALSE,0.480450320443056,0.480450320443056,0.186089286252268,0.333460393304676
221
+"Q9Z0V6",3,0.156915544469417,0.910384966932221,-1.42162872758755,0.354328216185911,FALSE,0.480930542593125,0.334267041059557,0.184802416347317,0.480930542593125
222
+"Q63569",2,1.08833269661863,-1.31313750315304,0.293969524138996,-0.0691647176045851,FALSE,0.480972627179024,0.209172933263139,0.480972627179024,0.309854439557836
223
+"Q75Q39",3,0.65187587361257,0.275583114885024,-1.48083856030799,0.553379571810401,FALSE,0.481401377932232,0.307916572651201,0.210682049416566,0.481401377932232
224
+"P07943",1,-0.125686974479761,0.357383505041906,-1.30530994470434,1.07361341414219,FALSE,0.481772029418749,0.481772029418749,0.159392032562573,0.358835938018678
225
+"P17475",2,-0.188431950503736,-1.02019779232277,1.37674510675709,-0.168115363930579,FALSE,0.481837682509172,0.240315081986559,0.481837682509172,0.277847235504269
226
+"P61589",2,0.712226854361772,0.554183540177929,0.198574782058425,-1.46498517659813,FALSE,0.482103738391995,0.182120713064681,0.482103738391995,0.335775548543323
227
+"Q02874",2,-0.533725672832341,-0.103696713637454,1.43702024004486,-0.799597853575069,FALSE,0.482186919063334,0.233287631047376,0.482186919063334,0.28452544988929
228
+"P38650",3,0.616508841843383,0.325109178337739,-1.48837930793847,0.546761287757353,FALSE,0.482365103594353,0.309953276368785,0.207681620036863,0.482365103594353
229
+"Q9QY17",3,0.7153134665451,1.00461041382569,-0.862744374132729,-0.857179506238064,FALSE,0.482383748933712,0.227867079992039,0.289749171074248,0.482383748933712
230
+"Q63716",1,-1.03152423066447,1.23056444746227,-0.547772491684534,0.348732274886734,FALSE,0.483204651475048,0.483204651475048,0.180430252164483,0.336365096360469
231
+"P62632",3,0.404357095902588,0.605880660403707,-1.49484454777292,0.484606791466622,FALSE,0.483716184006731,0.322261848984116,0.194021967009153,0.483716184006731
232
+"P25113",1,-0.141336993026551,0.370009394473594,-1.30113259623787,1.07246019479083,FALSE,0.483874525851675,0.483874525851675,0.159674253540533,0.356451220607791
233
+"P20760",2,-0.425005494225083,0.192563413252777,1.28994907569098,-1.05750699471867,FALSE,0.485143572763739,0.224031024915638,0.485143572763739,0.290825402320623
234
+"P53987",3,0.190682500449899,1.32298080922427,-0.940915406047772,-0.572747903626395,FALSE,0.486470698406916,0.267595946033884,0.2459333555592,0.486470698406916
235
+"P16036",3,0.283966300393445,0.864276513238112,-1.44393703940052,0.295694225768959,FALSE,0.486831936688648,0.316775791933423,0.196392271377929,0.486831936688648
236
+"P40329",3,0.833153665601106,0.17506641758682,-1.44404430814057,0.435824224952646,FALSE,0.488539281433157,0.286342544005479,0.225118174561365,0.488539281433157
237
+"Q499N5",2,0.93442879400088,0.393438371070514,0.0744543483902053,-1.4023215134616,FALSE,0.488591715831541,0.176653889432299,0.488591715831541,0.33475439473616
238
+"P60711",1,-1.4128422908071,0.00773150552204512,0.611317446405478,0.793793338879579,FALSE,0.488599782653959,0.488599782653959,0.229268395388987,0.282131821957055
239
+"P08733",1,-0.0757050126924025,-0.069497985273342,-1.14782810279411,1.29303110075986,FALSE,0.488640310618997,0.488640310618997,0.171259843930125,0.340099845450878
240
+"P27791",2,1.31266645071091,-0.0488858080404664,-0.144065449810621,-1.11971519285982,FALSE,0.488952222756717,0.173318573796338,0.488952222756717,0.337729203446944
241
+"P20767",2,-0.402545986448142,-0.323937810460321,1.47435207979616,-0.747868282887699,FALSE,0.490840261496814,0.230645058801972,0.490840261496814,0.278514679701214
242
+"Q9EQS0",2,0.96281907097593,0.373201605640607,0.0535242672162572,-1.38954494383279,FALSE,0.491710632690366,0.173241595379463,0.491710632690366,0.335047771930171
243
+"P62630",1,-0.729133141911815,1.13331515503016,-0.944479069125027,0.540297056006682,FALSE,0.492916752496068,0.492916752496068,0.16137951217824,0.345703735325692
244
+"P05964",2,0.646413874375567,-1.42297098946132,0.745897201961113,0.0306599131246435,FALSE,0.492935304716947,0.218300586719157,0.492935304716947,0.288764108563896
245
+"P38652",1,-1.20368817884026,1.14723154066156,-0.31338614506162,0.369842783240312,FALSE,0.492998698458767,0.492998698458767,0.188480686921627,0.318520614619606
246
+"P0C2X9",1,-1.00280094333105,1.20795752930497,-0.609620827231152,0.404464241257241,FALSE,0.494223373244407,0.494223373244407,0.174062744364838,0.331713882390755
247
+"P36970",3,0.145448674848607,1.10005973174975,-1.3274057746853,0.0818973680869483,FALSE,0.494680770633553,0.309444774365531,0.195874455000916,0.494680770633553
248
+"O88767",3,0.612427601145557,0.487241450032504,-1.49399875697727,0.394329705799209,FALSE,0.495721671449052,0.29697316589249,0.207305162658457,0.495721671449052
249
+"Q64057",2,1.01103552060703,0.317593365785639,0.0407792637679587,-1.36940815016063,FALSE,0.495727630529379,0.172027238978607,0.495727630529379,0.332245130492014
250
+"P45953",1,-1.13707370631782,1.1744480942933,-0.423061177926636,0.38568678995115,FALSE,0.496082758917829,0.496082758917829,0.182330291949833,0.321586949132337
251
+"Q9JLZ1",3,0.702725020507606,0.339677523977319,-1.48231916118297,0.439916616698041,FALSE,0.496931034077592,0.292844987090298,0.21022397883211,0.496931034077592
252
+"Q62930",2,-0.0184667811548216,-1.11079712957078,1.31568795357381,-0.186424042848207,FALSE,0.498746394859989,0.228623181957359,0.498746394859989,0.272630423182652
253
+"Q63270",3,0.333460994601858,1.22522462383142,-1.0733478752282,-0.485337743205076,FALSE,0.498979930246446,0.262098461421109,0.238921608332445,0.498979930246446
254
+"P62828",3,1.08615610447503,0.150545905438982,-1.33699031518311,0.100288305269096,FALSE,0.499846712196815,0.25030926925654,0.249844018546644,0.499846712196815
255
+"Q5I0K3",3,0.966957100596458,0.727402116859742,-1.07129291389388,-0.623066303562316,FALSE,0.49986876877681,0.222957359209653,0.277173872013537,0.49986876877681
256
+"P10959",2,0.588138371564071,-1.34990669168875,0.901316524954791,-0.139548204830107,TRUE,0.500299624022896,0.218883512236004,0.500299624022896,0.2808168637411
257
+"P04785",3,0.329939307396937,0.951239594020021,-1.40399419246906,0.1228152910521,TRUE,0.500696553380544,0.297514084768934,0.201789361850522,0.500696553380544
258
+"Q924S5",3,1.05442180351119,0.286468994771267,-1.34392001219493,0.0030292139124756,TRUE,0.501686208708585,0.248589018681892,0.249724772609523,0.501686208708585
259
+"P29418",1,-0.167530871978176,-0.227053025081898,-0.994876685687839,1.38946058274791,TRUE,0.502913663030115,0.502913663030115,0.176933819763765,0.32015251720612
260
+"Q6PDU7",1,-0.196347107405575,-0.379932981038088,-0.86317428582984,1.4394543742735,TRUE,0.50300918812343,0.50300918812343,0.182276161842298,0.314714650034272
261
+"P63029",3,0.841328519368094,0.306937173861929,-1.45125850542196,0.302992812191932,TRUE,0.504263540008634,0.273880301856888,0.221856158134478,0.504263540008634
262
+"P23693",1,-0.187491861704529,-0.393516382974135,-0.858670879114588,1.43967912379325,TRUE,0.504541794056461,0.504541794056461,0.180408449431066,0.315049756512472
263
+"Q3T1K5",1,-1.48313368681763,0.33006314771966,0.461237933334557,0.691832605763415,TRUE,0.504973758395322,0.504973758395322,0.214481740762681,0.280544500841997
264
+"Q7TPB1",3,1.0624155063188,0.260068023185278,-1.34284156388093,0.0203580343768552,TRUE,0.506575454836361,0.24615311482086,0.247271430342778,0.506575454836361
265
+"P68035",1,-0.261905544270804,-0.498690591813308,-0.713653470739271,1.47424960682338,TRUE,0.507487101186543,0.507487101186543,0.185797367474082,0.306715531339375
266
+"Q9JLJ3",3,0.305336219894994,1.19850115939848,-1.16398745336258,-0.33984992593089,TRUE,0.507562230100463,0.268510518468831,0.223927251430706,0.507562230100463
267
+"P27952",3,0.961905524020887,0.359291482633127,-1.39301458321931,0.0718175765653004,TRUE,0.507854766109066,0.25479011288511,0.237355121005824,0.507854766109066
268
+"P15651",1,-0.890769242129233,-0.619910917672807,0.171746326157539,1.3389338336445,TRUE,0.508843966926038,0.508843966926038,0.212983382194259,0.278172650879703
269
+"P00406",1,-1.47943676495414,0.663095302679733,0.2696702138964,0.546671248378007,TRUE,0.508865105626498,0.508865105626498,0.204297245943749,0.286837648429753
270
+"Q68FX0",3,0.743791286290024,0.469361573366731,-1.46988526953728,0.256732409880524,TRUE,0.509297788124899,0.276102565267977,0.214599646607124,0.509297788124899
271
+"Q63799",2,1.33413545605744,-0.154109626414114,-0.0899617531270758,-1.09006407651625,TRUE,0.509521448086069,0.166403683374736,0.509521448086069,0.324074868539195
272
+"P07335",2,1.30871692608124,-1.0524628671515,0.142750109932985,-0.399004168862721,TRUE,0.509643226748015,0.185812013393962,0.509643226748015,0.304544759858023
273
+"Q5RKI0",1,-1.30284284624402,1.05927134854635,-0.152878765508441,0.396450263206107,TRUE,0.509986742884159,0.509986742884159,0.18473016096209,0.305283096153751
274
+"P62282",3,0.902809750274333,0.742355741223915,-1.19712096881397,-0.448044522684274,TRUE,0.510532053999003,0.232598854043523,0.256869091957474,0.510532053999003
275
+"P41562",1,-0.768220641568104,1.07708462548251,-0.929682685326178,0.620818701411769,TRUE,0.510775973721211,0.510775973721211,0.161166402575664,0.328057623703125
276
+"P11517",2,0.45818689951494,-1.33958907498564,0.991668862577832,-0.110266687107128,TRUE,0.511138297972113,0.214349622787972,0.511138297972113,0.274512079239915
277
+"P68511",1,-0.798055082617286,-0.660698360641532,0.0726404894765839,1.38611295378223,TRUE,0.511597941584339,0.511597941584339,0.208923014509912,0.279479043905749
278
+"P63245",2,0.800249147274074,-1.3767364425039,0.674267785064973,-0.0977804898351472,TRUE,0.511690676333438,0.204961923929685,0.511690676333438,0.283347399736877
279
+"P97541",1,-0.97693066423971,-0.559802028816361,0.243268983723973,1.2934637093321,TRUE,0.511849367792731,0.511849367792731,0.212890016446521,0.275260615760747
280
+"Q5I0C3",1,-0.621357185331289,-0.687884989422374,-0.146525576314565,1.45576775106823,TRUE,0.512708754797516,0.512708754797516,0.202412490057027,0.284878755145457
281
+"Q6P747",2,1.2051817455036,0.036715690593303,0.00156003589687326,-1.24345747199378,TRUE,0.512865369694633,0.167975660651895,0.512865369694633,0.319158969653471
282
+"P07150",2,1.28290451090511,-1.08985116702453,0.175268888033425,-0.368322231914007,TRUE,0.513393751240551,0.18479133463175,0.513393751240551,0.301814914127699
283
+"Q9Z1P2",2,-0.125135311419987,0.381364953744286,1.05638404145626,-1.31261368378056,TRUE,0.513902999274984,0.197935100328854,0.513902999274984,0.288161900396162
284
+"Q07439",3,0.862466499703706,0.427304224703055,-1.43286010027288,0.143089375866117,TRUE,0.51435181298871,0.261271503959066,0.224376683052224,0.51435181298871
285
+"O88600",2,1.34706824505792,-0.212309343460355,-0.0691360346563616,-1.06562286694121,TRUE,0.515117865660325,0.165898977023843,0.515117865660325,0.318983157315832
286
+"Q68FS4",1,-0.189784260054557,-0.231110040310402,-0.977406813456026,1.39830111382098,TRUE,0.515414640614204,0.515414640614204,0.170245794458301,0.314339564927496
287
+"P25886",3,0.747505797435708,0.612199345127119,-1.4355138734764,0.0758087309135692,TRUE,0.517051727211694,0.263989759842005,0.218958512946301,0.517051727211694
288
+"P62856",2,-0.152396877788254,0.328294406581949,1.10652350483537,-1.28242103362907,TRUE,0.518808132680978,0.197268144169388,0.518808132680978,0.283923723149634
289
+"P12007",2,1.08825267729644,-1.25325768989134,0.422677421594451,-0.257672408999547,TRUE,0.519082493997437,0.192565819192909,0.519082493997437,0.288351686809654
290
+"Q5XI73",3,0.703335293381523,0.69438526211049,-1.42216422396268,0.0244436684706651,TRUE,0.519356738339837,0.263037180727195,0.217606080932968,0.519356738339837
291
+"P62853",1,-0.210996767304818,-0.260664706358473,-0.942367464273936,1.41402893793723,TRUE,0.519610064268356,0.519610064268356,0.170090509281229,0.310299426450415
292
+"P08010",2,1.29791388180563,-0.994615312919407,0.222626632347056,-0.525925201233283,TRUE,0.520776027181404,0.185608630308353,0.520776027181404,0.293615342510243
293
+"P62198",1,-1.48578407644085,0.458230935720076,0.348644260921328,0.678908879799445,TRUE,0.521036157773245,0.521036157773245,0.202546199613853,0.276417642612903
294
+"Q5U300",1,-0.222349946851389,-0.289018159268012,-0.91399118707545,1.42535929319485,TRUE,0.521361284112913,0.521361284112913,0.170468588878251,0.308170127008836
295
+"Q9JM53",1,-0.825538455960121,-0.602350114046033,0.0297558191317942,1.39813275087436,TRUE,0.522054584592215,0.522054584592215,0.203000466447246,0.27494494896054
296
+"O35878",1,-1.36655654286555,-0.0420760931990507,0.441039025202742,0.967593610861856,TRUE,0.523354780931369,0.523354780931369,0.208231001101107,0.268414217967524
297
+"Q63704",1,-1.38721342397836,0.00626154270392772,0.443407468124519,0.937544413149911,TRUE,0.523712509665439,0.523712509665439,0.207667308287438,0.268620182047123
298
+"P61206",2,0.28526642814357,0.454508253382566,0.734289280721871,-1.47406396224801,TRUE,0.524081923483513,0.183270877687013,0.524081923483513,0.292647198829473
299
+"P50753",1,-0.252765265787015,-0.235628931438395,-0.930818705778685,1.4192129030041,TRUE,0.528269413083326,0.528269413083326,0.168057046496699,0.303673540419975
300
+"Q6RUV5",2,1.05643402751295,0.146727079773443,0.152945782719761,-1.35610689000615,TRUE,0.528378445187557,0.166272983922652,0.528378445187557,0.305348570889791
301
+"P18266",1,-1.46558429178467,0.639160053570951,0.187326529881207,0.639097708332513,TRUE,0.528450119312257,0.528450119312257,0.194342841645035,0.277207039042709
302
+"Q4G069",2,1.31219701807565,-0.997970649526584,0.184079183086686,-0.498305551635749,TRUE,0.528856240924104,0.177317933049722,0.528856240924104,0.293825826026174
303
+"P35704",2,0.608709082732501,-1.32824145137973,0.910395135919007,-0.190862767271781,TRUE,0.529071944675775,0.201994619702894,0.529071944675775,0.268933435621331
304
+"P04639",2,0.677884923135875,0.414986278887402,0.39459433666685,-1.48746553869013,TRUE,0.529418743454404,0.168608950075847,0.529418743454404,0.301972306469749
305
+"P62076",1,-0.516422992830342,0.797668375503833,-1.15489163312675,0.873646250453264,TRUE,0.529829231886263,0.529829231886263,0.148335511026065,0.321835257087672
306
+"P0CG51",1,-1.42281826509725,0.124287889190763,0.407345638794595,0.891184737111889,TRUE,0.532052397379553,0.532052397379553,0.201670086802062,0.266277515818385
307
+"P62083",2,1.03259857425831,0.175598603543809,0.161745750585979,-1.3699429283881,TRUE,0.532720321110353,0.162713793123643,0.532720321110353,0.304565885766004
308
+"B0LPN4",2,1.3042496787138,-0.162345425779799,-0.0139045176986983,-1.1279997352353,TRUE,0.532777919034989,0.158022238928749,0.532777919034989,0.309199842036262
309
+"Q5XIT9",1,-0.305147632512247,-0.3647066519782,-0.794125912121558,1.46398019661201,TRUE,0.532879867382057,0.532879867382057,0.171124825007679,0.295995307610264
310
+"P29117",1,-0.273365045923739,0.226397644372468,-1.17503886678108,1.22200626833235,TRUE,0.533800254892782,0.533800254892782,0.153153252691981,0.313046492415237
311
+"P07871",1,-1.13462557060349,1.08530023761622,-0.49183114495319,0.541156477940463,TRUE,0.534200436113758,0.534200436113758,0.167476014417186,0.298323549469056
312
+"Q9QWN8",2,0.537310057288955,0.421651351975514,0.538778728784445,-1.49774013804891,TRUE,0.534944129768818,0.17151001083904,0.534944129768818,0.293545859392142
313
+"P11507",2,1.0836554678088,0.14055272727641,0.114735948645809,-1.33894414373102,TRUE,0.539249319814237,0.155724637936533,0.539249319814237,0.30502604224923
314
+"P50399",1,-0.9544226834536,1.09904990646176,-0.73212726989488,0.587500046886722,TRUE,0.540260694342603,0.540260694342603,0.153885179483263,0.305854126174134
315
+"P05508",2,0.933293948421451,0.234674396408758,0.25022662416073,-1.41819496899094,TRUE,0.540306110046703,0.161586258559766,0.540306110046703,0.298107631393531
316
+"P80432",1,-0.465807686514058,0.706489302275282,-1.18216288451876,0.941481268757534,TRUE,0.540485646085411,0.540485646085411,0.142521830795775,0.316992523118814
317
+"P26644",2,-0.18142369944573,-0.046129600413803,1.32601986997816,-1.09846657011863,TRUE,0.541360223570161,0.195431864392926,0.541360223570161,0.263207912036913
318
+"Q78P75",2,0.983307677905425,0.191427891032889,0.22085852809513,-1.39559409703344,TRUE,0.541501783303136,0.160658718615994,0.541501783303136,0.29783949808087
319
+"P97532",2,1.38156794344043,-0.688562095462086,0.0876765928495033,-0.780682440827852,TRUE,0.541976852059226,0.165459760019407,0.541976852059226,0.292563387921368
320
+"Q5XIM9",2,1.29156669513146,-0.201371932514382,0.0452595050762073,-1.13545426769328,TRUE,0.542795010232523,0.158010999477592,0.542795010232523,0.299193990289886
321
+"P62268",1,-1.17123237595056,-0.298629652425309,0.255980149804675,1.21388187857119,TRUE,0.544127119548474,0.544127119548474,0.196010216304974,0.259862664146552
322
+"Q8VID1",1,-1.13989967801832,-0.333455602122196,0.234657623184426,1.23869765695609,TRUE,0.544973787361954,0.544973787361954,0.195224261337655,0.259801951300391
323
+"P62898",1,-0.287887149406363,-0.0549052405836734,-1.02345799955041,1.36625038954044,TRUE,0.545490761846747,0.545490761846747,0.156968569300732,0.297540668852521
324
+"P06399",2,-0.0612782451964428,-0.770507479275509,1.42995140475916,-0.598165680287207,TRUE,0.546034521768977,0.20130212475503,0.546034521768977,0.252663353475993
325
+"Q5XIG4",1,-0.300333451638261,0.191172936765903,-1.14276988288864,1.251930397761,TRUE,0.547117769625615,0.547117769625615,0.149492098100609,0.303390132273776
326
+"P14882",2,1.05246188612569,-1.23292864125681,0.512090473610902,-0.331623718479786,TRUE,0.547299835067277,0.179963270505653,0.547299835067277,0.27273689442707
327
+"P24049",1,-1.44768380493906,0.67905263983675,0.112560012907536,0.65607115219477,TRUE,0.549669190843987,0.549669190843987,0.181063990158864,0.269266818997148
328
+"P14480",2,-0.0907631949489523,-0.66583164858452,1.44183218367045,-0.685237340136973,TRUE,0.550233300818159,0.198514578967653,0.550233300818159,0.251252120214188
329
+"P20059",2,-0.0267638237320822,-0.816942812229043,1.41582708410926,-0.572120448148132,TRUE,0.550381810890924,0.198914752158837,0.550381810890924,0.250703436950239
330
+"Q5XHZ0",1,-0.296574095675679,0.0508057301762476,-1.07696196130695,1.32273032680638,TRUE,0.551558595342715,0.551558595342715,0.151214967646374,0.297226437010911
331
+"P56741",1,-0.466576815510493,-0.481388901237946,-0.551017458925199,1.49898317567364,TRUE,0.552635767665373,0.552635767665373,0.17024350997587,0.277120722358757
332
+"Q9EQX9",1,-0.683348229493468,-0.56950281760202,-0.217340991812806,1.47019203890829,TRUE,0.55297408912377,0.55297408912377,0.179920505181542,0.267105405694688
333
+"P23562",2,0.546266988589785,-1.248003765712,1.02089142016628,-0.319154643044071,TRUE,0.554758508913579,0.190490721134244,0.554758508913579,0.254750769952177
334
+"P62703",1,-1.42004877362002,0.741565259607286,0.020358936137696,0.658124577875038,TRUE,0.555092412325459,0.555092412325459,0.176564446738078,0.268343140936463
335
+"P23514",1,-0.874598615199346,-0.506593661460024,-0.0251531445578931,1.40634542121726,TRUE,0.555672046238619,0.555672046238619,0.184251214846177,0.260076738915204
336
+"P30009",2,1.30231981507758,-0.402459114903677,0.15715906681493,-1.05701976698883,TRUE,0.55586041197468,0.162232832164298,0.55586041197468,0.281906755861022
337
+"P34064",2,-0.112467051915412,-0.612979266679844,1.44634472614474,-0.720898407549486,TRUE,0.557185335232632,0.194323817457367,0.557185335232632,0.248490847310001
338
+"P62836",1,-0.78650523727053,-0.522089634730003,-0.137100585080301,1.44569545708083,TRUE,0.557378705032504,0.557378705032504,0.180866972212017,0.261754322755479
339
+"Q704S8",1,-1.1708652328928,0.986630708690962,-0.472977097770467,0.65721162197231,TRUE,0.557411694729272,0.557411694729272,0.163877802975514,0.278710502295214
340
+"P46462",1,-0.818871342991928,0.992382909837861,-0.902100113130873,0.72858854628494,TRUE,0.55907854406306,0.55907854406306,0.144059961046448,0.296861494890492
341
+"Q9WVK7",1,-0.325989379400244,0.0233738739010767,-1.04188052125684,1.344496026756,TRUE,0.559368609580317,0.559368609580317,0.150455692702013,0.29017569771767
342
+"Q63065",2,0.0618231831691719,0.207214335769613,1.07317522490248,-1.34221274384127,TRUE,0.560011806171845,0.176749047255309,0.560011806171845,0.263239146572845
343
+"P11915",1,-1.23484836506617,-0.106458011927366,0.139491815415058,1.20181456157848,TRUE,0.561227945820585,0.561227945820585,0.186956873397439,0.251815180781976
344
+"P11250",1,-0.59107029448575,-0.506463269412623,-0.397763962868612,1.49529752676699,TRUE,0.561802944428876,0.561802944428876,0.171135516319641,0.267061539251483
345
+"P11608",1,-1.44366298618524,0.605500295924797,0.10447983028852,0.733682859971923,TRUE,0.562867138412137,0.562867138412137,0.176433874853043,0.26069898673482
346
+"P83732",1,-0.317472537614832,0.0885287910554093,-1.082433766583,1.31137751314242,TRUE,0.563963728174883,0.563963728174883,0.144601952500741,0.291434319324376
347
+"P27139",2,0.39048467889667,-1.14392996813123,1.1689050862377,-0.415459797003141,TRUE,0.564226316105883,0.188421854884189,0.564226316105883,0.247351829009928
348
+"P50878",2,0.663423439439013,0.292640425534987,0.526259326160386,-1.48232319113439,TRUE,0.565093717870551,0.158537797013089,0.565093717870551,0.27636848511636
349
+"P19804",2,0.983718307210816,0.117568727787527,0.289612193453449,-1.39089922845179,TRUE,0.566222877053967,0.152795658054065,0.566222877053967,0.280981464891968
350
+"P04276",2,0.0148307821100795,-0.761473927006031,1.40801947847706,-0.661376333581112,TRUE,0.566576361155997,0.189703104864285,0.566576361155997,0.243720533979717
351
+"P16409",1,-0.975974365973671,-0.401368409620039,0.00389373191821932,1.37344904367549,TRUE,0.566603275943126,0.566603275943126,0.180467639806044,0.25292908425083
352
+"P17702",1,-1.25236968612297,-0.170035975090315,0.26902695839654,1.15337870281675,TRUE,0.566923474183924,0.566923474183924,0.183442131740407,0.249634394075669
353
+"Q99NA5",1,-0.580187168589801,0.74511314966662,-1.10583705557537,0.940911074498555,TRUE,0.571453749129768,0.571453749129768,0.135235860848454,0.293310390021778
354
+"Q99PS8",2,0.873425984156391,-1.20645703369901,0.769065786599691,-0.436034737057076,TRUE,0.57325060547806,0.175247352361952,0.57325060547806,0.251502042159988
355
+"P06761",1,-1.42387868722725,0.673319488498184,0.0306487859785608,0.719910412750502,TRUE,0.573365135562688,0.573365135562688,0.168899674427548,0.257735190009764
356
+"B0BNE5",2,0.5619290649879,-1.20431251431397,1.03796883290679,-0.39558538358072,TRUE,0.573579717295385,0.180843746246253,0.573579717295385,0.245576536458362
357
+"Q62736",2,-0.00444423298826263,-0.691728306745138,1.41559835314755,-0.719425813414146,TRUE,0.574374314599799,0.185178624112739,0.574374314599799,0.240447061287462
358
+"P48679",2,1.31470890802267,-0.801484641816074,0.242117895262323,-0.755342161468919,TRUE,0.575854807819147,0.155608589167904,0.575854807819147,0.268536603012949
359
+"P13221",1,-1.1224818875927,-0.273927564884718,0.110829879254903,1.28557957322252,TRUE,0.576731595158821,0.576731595158821,0.177172183722865,0.246096221118314
360
+"P62890",2,0.926403337077201,0.124373122992671,0.361810338159014,-1.41258679822889,TRUE,0.577745697624175,0.150054364391588,0.577745697624175,0.272199937984237
361
+"Q66H98",2,1.2155479347593,-0.208529947284694,0.193597836611944,-1.20061582408655,TRUE,0.580173434513133,0.147361690612716,0.580173434513133,0.272464874874151
362
+"P62271",2,0.0854748796023107,0.0812866374284336,1.13567252697943,-1.30243404401018,TRUE,0.580365072743027,0.169674967368839,0.580365072743027,0.249959959888134
363
+"P04762",1,-1.17665763556217,0.950518518461888,-0.472772529641214,0.698911646741496,TRUE,0.581745523351931,0.581745523351931,0.152685012226599,0.26556946442147
364
+"P13086",1,-0.491206664955999,-0.264756821418305,-0.718120314435605,1.47408380080991,TRUE,0.582754641617172,0.582754641617172,0.154096760119612,0.263148598263216
365
+"P38718",2,0.178123553838043,0.121633850559722,1.05605453708522,-1.35581194148298,TRUE,0.583063386015915,0.166564459847748,0.583063386015915,0.250372154136336
366
+"P18886",1,-1.03809119653527,0.941345795275714,-0.669803783620534,0.766549184880087,TRUE,0.583454720167635,0.583454720167635,0.149531657363522,0.267013622468843
367
+"Q4QQT4",2,0.0402508693423748,-0.695572132878278,1.40000299693385,-0.74468173339795,TRUE,0.583531476742295,0.180203146427875,0.583531476742295,0.236265376829829
368
+"P31000",2,0.0979410436793736,-0.833309874393075,1.37406867263867,-0.638699841924972,TRUE,0.584268361237951,0.180060621175595,0.584268361237951,0.235671017586453
369
+"P01026",2,0.426633978530632,-1.04042852269756,1.18641988870454,-0.572625344537611,TRUE,0.585003380484309,0.178240126884446,0.585003380484309,0.236756492631245
370
+"P02680",2,0.0739924899379389,-0.682732467077885,1.38675608187179,-0.778016104731848,TRUE,0.585907025096644,0.178902981707484,0.585907025096644,0.235189993195872
371
+"P09006",2,0.0251629809272163,-0.635286016383908,1.40270750860621,-0.792584473149514,TRUE,0.58818712226174,0.177391208788366,0.58818712226174,0.234421668949894
372
+"Q02253",1,-1.38332891742223,0.705245497454493,-0.084710182239651,0.76279360220739,TRUE,0.588821531279638,0.588821531279638,0.160763109386282,0.25041535933408
373
+"P81155",1,-0.45437280199218,-0.149877749807794,-0.835530790810652,1.43978134261063,TRUE,0.588872667170189,0.588872667170189,0.147565459558434,0.263561873271377
374
+"P02651",2,0.908514198456601,-1.17523835602384,0.748929243932219,-0.48220508636498,TRUE,0.589465468706267,0.166229644773807,0.589465468706267,0.244304886519926
375
+"Q62651",1,-1.15280996392757,0.938932406834555,-0.512158676524643,0.726036233617657,TRUE,0.589553999479856,0.589553999479856,0.149018150571369,0.261427849948775
376
+"B0BNN3",2,0.390558126887882,-1.0686431425499,1.19798561979193,-0.519900604129914,TRUE,0.58975577825114,0.175403724809777,0.58975577825114,0.234840496939083
377
+"Q2TA68",1,-0.458730967076316,-0.113103111523554,-0.85716573969834,1.42899981829821,TRUE,0.589884264083543,0.589884264083543,0.147130321765828,0.262985414150629
378
+"P29314",1,-1.4241520833368,0.432312680389291,0.113150914029928,0.878688488917583,TRUE,0.592070474971518,0.592070474971518,0.165073740366774,0.242855784661708
379
+"P10860",1,-1.24546504676826,0.905248286711624,-0.364432841381446,0.704649601438082,TRUE,0.592411880233716,0.592411880233716,0.150187708989909,0.257400410776375
380
+"Q68FT1",2,1.0953420321444,-1.04839999668325,0.568129143791432,-0.61507117925258,TRUE,0.593942607421835,0.159776703755997,0.593942607421835,0.246280688822169
381
+"P02401",1,-1.32729837485102,0.0744205458635489,0.153211073339472,1.099666755648,TRUE,0.59548833627686,0.59548833627686,0.167699967995157,0.236811695727983
382
+"P56571",1,-0.451176814948704,-0.0449160819376839,-0.907671498563243,1.40376439544963,TRUE,0.596412013851664,0.596412013851664,0.142122477539739,0.261465508608597
383
+"P48721",1,-0.962941416308281,0.915262859291596,-0.761622720814342,0.809301277831027,TRUE,0.59643410307672,0.59643410307672,0.140951097577538,0.262614799345742
384
+"Q5BJQ0",2,1.08726159627616,-1.04336610793286,0.581494870801643,-0.625390359144938,TRUE,0.598721923619409,0.157804109423717,0.598721923619409,0.243473966956874
385
+"P13635",2,0.283953775325823,-0.922570200750295,1.28479229045635,-0.646175865031879,TRUE,0.599722292324779,0.171476559634601,0.599722292324779,0.22880114804062
386
+"Q9QX79",2,1.00288406721337,-1.05457723129276,0.689455774020256,-0.637762609940871,TRUE,0.601098746382499,0.16046780314322,0.601098746382499,0.238433450474281
387
+"P20759",2,0.162063304269774,-0.596716697311395,1.34053702466903,-0.905883631627405,TRUE,0.601258287134778,0.170489350400918,0.601258287134778,0.228252362464303
388
+"P47853",2,0.0975859407159747,-0.607614700796025,1.37108263321649,-0.861053873136442,TRUE,0.601420213205559,0.170253569676576,0.601420213205559,0.228326217117864
389
+"Q07936",2,1.2162882689319,-0.286503049997499,0.244441082290886,-1.17422630122529,TRUE,0.601603635653311,0.140128783658878,0.601603635653311,0.258267580687811
390
+"P31399",1,-0.470208570391622,-0.0412241154858339,-0.894592914726523,1.40602560060398,TRUE,0.603089442913321,0.603089442913321,0.139965059371252,0.256945497715427
391
+"P01946",2,0.562191521135483,-1.09254439867149,1.08665387094115,-0.556300993405134,TRUE,0.603567937439932,0.166804250704086,0.603567937439932,0.229627811855981
392
+"P23764",2,1.14076870532357,-0.995727031920226,0.517672307678158,-0.662713981081502,TRUE,0.603800985887459,0.153029665200336,0.603800985887459,0.243169348912205
393
+"P61980",2,1.28512705913331,-0.585331025514121,0.266940206762592,-0.966736240381781,TRUE,0.603950394436692,0.142631806030813,0.603950394436692,0.253417799532495
394
+"Q63041",2,0.170731195865037,-0.691886992252908,1.34601365554104,-0.824857859153172,TRUE,0.604635356798358,0.169051096891344,0.604635356798358,0.226313546310298
395
+"Q63798",2,0.480211732431078,0.15571451110359,0.809633567980214,-1.44555981151488,TRUE,0.606021054481872,0.149624674857497,0.606021054481872,0.244354270660631
396
+"Q8K4G6",2,0.977227619618984,-1.10964231740671,0.700617815697088,-0.568203117909363,TRUE,0.606054712871873,0.156969016760013,0.606054712871873,0.236976270368114
397
+"Q9JJW3",1,-0.588897268266176,-0.252317692185216,-0.636680201721688,1.47789516217308,TRUE,0.606506608578668,0.606506608578668,0.146738854250004,0.246754537171329
398
+"Q01129",2,1.06209980219484,-1.06407929662946,0.609133357503201,-0.607153863068581,TRUE,0.608554618061992,0.153119589485147,0.608554618061992,0.238325792452861
399
+"P20761",2,1.25414499282135,-0.472901286199923,0.279569852816653,-1.06081355943808,TRUE,0.611181678132497,0.13924519928831,0.611181678132497,0.249573122579193
400
+"O35413",1,-0.781381830599306,0.835071675856656,-0.946262246603309,0.892572401345959,TRUE,0.611505611520704,0.611505611520704,0.126249928997027,0.262244459482269
401
+"P62494",1,-0.875226642368928,-0.321562156996831,-0.242564692226915,1.43935349159267,TRUE,0.612101579515386,0.612101579515386,0.154033477851331,0.233864942633283
402
+"P31232",2,0.0852877705736374,-0.475230474522176,1.35489685305067,-0.964954149102127,TRUE,0.613037149332551,0.163052140961503,0.613037149332551,0.223910709705946
403
+"P47858",2,1.09377304025547,-1.01669877290107,0.580742254098493,-0.657816521452892,TRUE,0.61319433255959,0.150368545590181,0.61319433255959,0.236437121850229
404
+"Q8VHF5",1,-0.630732436452763,0.667069504356059,-1.05656505713357,1.02022798923028,TRUE,0.613202271007935,0.613202271007935,0.123900305244597,0.262897423747468
405
+"P11232",1,-1.10827386841977,0.914194174504143,-0.580139811657746,0.774219505573374,TRUE,0.613756077284971,0.613756077284971,0.136867629320059,0.24937629339497
406
+"P42930",1,-1.39057076074652,0.603721914117707,-0.0494453408659702,0.836294187494779,TRUE,0.614565478878515,0.614565478878515,0.150266044562048,0.235168476559437
407
+"P18418",2,0.382490457142129,0.0804148684808296,0.939037368943889,-1.40194269456685,TRUE,0.614936033015275,0.149584395739844,0.614936033015275,0.235479571244881
408
+"P08649",2,0.339763624111834,-0.898697034072057,1.25944146034262,-0.700508050382392,TRUE,0.616039428762717,0.162950423564012,0.616039428762717,0.221010147673271
409
+"P04166",1,-1.38864635228415,0.381825318512846,0.0456843774702084,0.961136656301095,TRUE,0.61657980024832,0.61657980024832,0.153939272314761,0.229480927436919
410
+"P07340",2,1.08387060678733,-0.167734548356789,0.371822623296161,-1.2879586817267,TRUE,0.616937142546284,0.137609467205897,0.616937142546284,0.245453390247819
411
+"Q01177",2,1.24932283618298,-0.699201362739387,0.356996652904822,-0.907118126348413,TRUE,0.618363966556507,0.140190083262533,0.618363966556507,0.241445950180961
412
+"Q68FP1",2,0.534522985379896,-1.03781470847353,1.12071850802388,-0.617426784930247,TRUE,0.61947297572829,0.159395414547526,0.61947297572829,0.221131609724184
413
+"P06866",2,0.357087461355177,-0.865334063347174,1.25275441395408,-0.744507811962079,TRUE,0.619981398900092,0.161083256136608,0.619981398900092,0.2189353449633
414
+"P01836",2,0.53098960676532,-0.920346061893419,1.14209944837598,-0.752742993247878,TRUE,0.620455631626226,0.160416650153889,0.620455631626226,0.219127718219885
415
+"P58775",2,0.340197608778361,0.011671454259343,1.01196770464695,-1.36383676768466,TRUE,0.621360540967648,0.14911230029723,0.621360540967648,0.229527158735121
416
+"B0K020",1,-0.737154900693624,-0.282206753622316,-0.45401334358513,1.47337499790107,TRUE,0.622623477913808,0.622623477913808,0.144696151597066,0.232680370489126
417
+"Q7TQ16",1,-0.499977124470033,0.12996983278078,-0.969266257518969,1.33927354920822,TRUE,0.623040845419537,0.623040845419537,0.129168922389685,0.247790232190777
418
+"P62250",2,0.1862367106406,-0.175732438444619,1.20602380847882,-1.2165280806748,TRUE,0.623915373914253,0.153135257411074,0.623915373914253,0.222949368674673
419
+"Q07969",1,-1.38245722875248,0.400738690947735,0.0184532631653863,0.963265274639362,TRUE,0.626179667570444,0.626179667570444,0.148862050147334,0.224958282282222
420
+"P21396",1,-0.788588412440127,0.776538914982373,-0.936058855334124,0.948108352791878,TRUE,0.626623579769195,0.626623579769195,0.123998980972177,0.249377439258628
421
+"Q5XIM5",1,-0.908053298894656,-0.24967146778828,-0.27053153200154,1.42825629868448,TRUE,0.628390707061008,0.628390707061008,0.146935299429877,0.224673993509114
422
+"P12075",1,-1.26793202105795,0.0743770286177042,0.0160324197879628,1.17752257265228,TRUE,0.628783523061795,0.628783523061795,0.151053734531624,0.220162742406582
423
+"P15800",1,-0.784297472230128,0.778381404337792,-0.940170367838262,0.946086435730598,TRUE,0.630177742005276,0.630177742005276,0.121501959583347,0.248320298411377
424
+"Q9WTT6",2,0.80890406594525,-1.08222417923816,0.890686944696315,-0.617366831403408,TRUE,0.630508147181642,0.149730789522789,0.630508147181642,0.219761063295568
425
+"P35171",1,-1.38077398054179,0.4633691767383,-0.0198038330037166,0.937208636807204,TRUE,0.630688068376487,0.630688068376487,0.145630445145283,0.22368148647823
426
+"Q6NYB7",2,0.224068341391805,-0.635255378800842,1.315031798246,-0.903844760836961,TRUE,0.631566823398482,0.154851535331113,0.631566823398482,0.213581641270405
427
+"Q64560",2,1.14214132967965,-0.858480449230577,0.535772966562172,-0.819433847011242,TRUE,0.634605375194828,0.139596159162174,0.634605375194828,0.225798465642997
428
+"P04937",2,0.753607266463898,-0.986941201935232,0.962480419134432,-0.729146483663098,TRUE,0.636199763123935,0.149770004014117,0.636199763123935,0.214030232861949
429
+"Q4QQV3",1,-0.66920500946155,-0.165917039675088,-0.625492610864666,1.4606146600013,TRUE,0.637497611444932,0.637497611444932,0.134919021778727,0.22758336677634
430
+"Q6AXV4",1,-1.19076943099747,0.830227067268889,-0.463077782910879,0.82362014663946,TRUE,0.638012783680123,0.638012783680123,0.131396409148754,0.230590807171123
431
+"Q5XIN6",1,-0.998710018616846,0.8672376187346,-0.722246894865003,0.85371929474725,TRUE,0.638503565909772,0.638503565909772,0.124040805015921,0.237455629074307
432
+"P62260",1,-1.13114051320034,0.878930425527785,-0.550724876570803,0.80293496424336,TRUE,0.638595372497416,0.638595372497416,0.126899382405265,0.234505245097319
433
+"P60868",1,-1.35936752610052,0.493426954703629,-0.0836162185579383,0.949556789954831,TRUE,0.640197936852094,0.640197936852094,0.140978815982039,0.218823247165867
434
+"Q9Z1Y3",1,-0.846558817209897,0.806062699653354,-0.883295278716713,0.923791396273256,TRUE,0.640605338949296,0.640605338949296,0.118830869134417,0.240563791916288
435
+"P11884",1,-0.934130101211601,-0.21801463435277,-0.265400099792983,1.41754483535735,TRUE,0.644027188073309,0.644027188073309,0.139656270225403,0.216316541701289
436
+"P02466",2,1.12897992566093,-0.86866329718979,0.554292571526405,-0.814609199997548,TRUE,0.644795320344054,0.134963648517433,0.644795320344054,0.220241031138514
437
+"P47875",2,0.887628485937433,-1.05443716804006,0.820413622334687,-0.653604940232057,TRUE,0.644799257663327,0.141160754607533,0.644799257663327,0.21403998772914
438
+"P14604",1,-1.34906799541284,0.418209969856853,-0.0692987838597552,1.00015680941574,TRUE,0.647275677358585,0.647275677358585,0.138952099543173,0.213772223098242
439
+"P12346",2,0.492406583688901,-0.881852948783289,1.17043750995543,-0.780991144861046,TRUE,0.651199041918572,0.144832639841393,0.651199041918572,0.203968318240036
440
+"P38983",1,-1.15720818305547,0.839460259971627,-0.514065048207758,0.831812971291606,TRUE,0.651348978474501,0.651348978474501,0.123658999811777,0.224992021713723
441
+"P62243",2,0.302790675173723,-0.304602976459511,1.187399553815,-1.18558725252922,TRUE,0.653310068430442,0.140734190510748,0.653310068430442,0.20595574105881
442
+"P29419",1,-0.606514491268633,0.400529539212232,-1.00391794488732,1.20990289694372,TRUE,0.653902666963735,0.653902666963735,0.115461866319085,0.230635466717179
443
+"Q9WUS0",2,1.15582439339274,-0.489244716590903,0.44212790261472,-1.10870757941655,TRUE,0.653988834065174,0.126579078438633,0.653988834065174,0.219432087496193
444
+"Q811A2",1,-1.24764052788887,0.102871307721149,-0.0511385745272793,1.195907794695,TRUE,0.655963540323956,0.655963540323956,0.137587843823845,0.206448615852199
445
+"P51886",2,0.344380836895407,-0.203032373733553,1.11890342464338,-1.26025188780523,TRUE,0.656100927153619,0.137347266557041,0.656100927153619,0.206551806289341
446
+"O35303",1,-1.3054140144265,0.238038045433344,-0.0449251895122416,1.1123011585054,TRUE,0.656802065642979,0.656802065642979,0.136454964437428,0.206742969919592
447
+"Q05962",1,-0.708480998497477,-0.134760379718754,-0.609002011946463,1.45224339016269,TRUE,0.657007701964287,0.657007701964287,0.12698883577674,0.216003462258974
448
+"P40307",2,0.946725307607577,-0.150731489062729,0.541201720027968,-1.33719553857282,TRUE,0.657765402104505,0.124265367797776,0.657765402104505,0.217969230097719
449
+"Q63081",2,0.580223922754806,-0.0831099267384291,0.876803339177833,-1.37391733519421,TRUE,0.658126532567725,0.131659253480812,0.658126532567725,0.210214213951463
450
+"Q5XIF6",1,-0.59300662846968,0.0749073486863052,-0.860887544919984,1.37898682470336,TRUE,0.659695429870066,0.659695429870066,0.118794698715557,0.221509871414377
451
+"P42123",1,-0.685045635814527,-0.0774279367606676,-0.675653562098333,1.43812713467353,TRUE,0.660031024022953,0.660031024022953,0.124722360690921,0.215246615286126
452
+"Q5XIC0",1,-0.925292031940247,0.768427646825985,-0.79936345267094,0.956227837785201,TRUE,0.660461840787959,0.660461840787959,0.117130689978999,0.222407469233042
453
+"P04636",1,-0.587545692388514,0.16668498401202,-0.916167246451181,1.33702795482767,TRUE,0.660974563323111,0.660974563323111,0.116603712188141,0.222421724488748
454
+"P29457",2,0.483765543336224,-0.114659136138129,0.974046039380017,-1.34315244657811,TRUE,0.661303589815445,0.131996481074693,0.661303589815445,0.206699929109862
455
+"O08557",2,0.370248667582816,-0.24542399633617,1.1197239481654,-1.24454861941204,TRUE,0.661913646301017,0.135377586242463,0.661913646301017,0.20270876745652
456
+"Q6UPE1",1,-0.801987920857487,0.676482923806955,-0.909695566014417,1.03520056306495,TRUE,0.662221853742281,0.662221853742281,0.114359359143996,0.223418787113722
457
+"P80254",1,-1.20149526553049,0.0621757201132562,-0.102470718137978,1.24179026355521,TRUE,0.663329289266264,0.663329289266264,0.134246616076843,0.202424094656893
458
+"P63018",1,-1.33518853352291,0.512504082016222,-0.143728171804577,0.966412623311266,TRUE,0.663611025112772,0.663611025112772,0.129474786748775,0.206914188138452
459
+"Q6P6R2",1,-0.597410135732198,0.321110766983129,-0.980290822417484,1.25659019116655,TRUE,0.663621913029818,0.663621913029818,0.112494298587459,0.223883788382723
460
+"P63039",1,-0.628353206257789,0.0262462865979627,-0.799677435819485,1.40178435547931,TRUE,0.663753901622567,0.663753901622567,0.119596025133799,0.216650073243635
461
+"O88761",1,-1.18781959870219,0.785649276296788,-0.466361215475405,0.868531537880808,TRUE,0.666378237758994,0.666378237758994,0.1198450283782,0.213776733862806
462
+"P41123",1,-1.2974212707702,0.254523149680236,-0.073571009260818,1.11646913035078,TRUE,0.666917270134133,0.666917270134133,0.131577305213129,0.201505424652738
463
+"B4F7A1",1,-0.773188375230204,0.67730065186968,-0.936649032779207,1.03253675613973,TRUE,0.667315406469402,0.667315406469402,0.109214806860123,0.223469786670475
464
+"P32551",1,-0.826939415852127,0.7161688214401,-0.892543592377494,1.00331418678952,TRUE,0.668555667797472,0.668555667797472,0.110243342989078,0.221200989213451
465
+"O35115",2,0.441607480316347,-0.175471856152593,1.03714122390325,-1.30327684806701,TRUE,0.669274426714186,0.129937121509219,0.669274426714186,0.200788451776595
466
+"B2GV54",1,-1.23803880474347,0.123656648578671,-0.0874193299247909,1.20180148608959,TRUE,0.669314698902238,0.669314698902238,0.131186343336697,0.199498957761065
467
+"P07872",1,-1.1985775963355,0.122683699025297,-0.158324053333857,1.23421795064406,TRUE,0.669876477321029,0.669876477321029,0.131685941186916,0.198437581492055
468
+"P26772",1,-0.62356012123183,0.1530894551725,-0.877658433264579,1.34812909932391,TRUE,0.670303157235549,0.670303157235549,0.115098670399936,0.214598172364515
469
+"P14046",2,0.793894451710395,-0.944825897768602,0.931516385006709,-0.780584938948503,TRUE,0.67075387771514,0.132240591663061,0.67075387771514,0.197005530621799
470
+"P24268",1,-1.27997407702023,0.656657100901126,-0.295056349254152,0.91837332537326,TRUE,0.671320411569771,0.671320411569771,0.122831243318592,0.205848345111637
471
+"P56574",1,-0.69779180033383,-0.0361393573241674,-0.691914272275097,1.42584542993309,TRUE,0.671357938430646,0.671357938430646,0.119945707890579,0.208696353678775
472
+"P62963",1,-1.28391328785573,0.239481903951613,-0.0896652724132517,1.13409665631737,TRUE,0.671448403615347,0.671448403615347,0.129665974962982,0.198885621421671
473
+"Q66HD0",2,0.673597714134831,-0.129521144222161,0.819172220800402,-1.36324879071307,TRUE,0.673172385127814,0.124480452789411,0.673172385127814,0.202347162082775
474
+"P18163",1,-0.958611485553349,0.739908154897204,-0.759464877062141,0.978168207718286,TRUE,0.674997756097502,0.674997756097502,0.113754842397085,0.211247401505413
475
+"Q8VIF7",2,0.680844497284992,-0.138035453509965,0.817190020421299,-1.35999906419633,TRUE,0.67633123764042,0.123102211772454,0.67633123764042,0.200566550587126
476
+"P13697",1,-1.06056424115228,0.768376592709003,-0.641977901960249,0.934165550403522,TRUE,0.676769709269387,0.676769709269387,0.114563389289345,0.208666901441267
477
+"D3ZAF6",1,-0.795794121431482,0.657100799760661,-0.911803770166623,1.05049709183744,TRUE,0.677527395024154,0.677527395024154,0.107477823269034,0.214994781706812
478
+"P36201",1,-0.68038849577225,0.0094772643020312,-0.739700358071874,1.41061158954209,TRUE,0.677974732812908,0.677974732812908,0.115829795918396,0.206195471268696
479
+"P11240",1,-1.02659124692239,-0.0449593768298388,-0.291865521017455,1.36341614476968,TRUE,0.679645841976756,0.679645841976756,0.125401616064598,0.194952541958646
480
+"P20280",2,1.10868184216276,-0.514436491178559,0.518234884361035,-1.11248023534523,TRUE,0.680780475555364,0.117071566267311,0.680780475555364,0.202147958177324
481
+"P10888",1,-0.675692051961226,0.0706804130712309,-0.782718809037126,1.38773044792712,TRUE,0.682110506474753,0.682110506474753,0.113543167828224,0.204346325697023
482
+"P70623",2,0.405179407448735,-0.558298613544979,1.19736501886647,-1.04424581277022,TRUE,0.683129816826834,0.129000648482783,0.683129816826834,0.187869534690384
483
+"P12847",1,-0.685126579506199,0.0107111177813645,-0.735887962564606,1.41030342428944,TRUE,0.683340365713086,0.683340365713086,0.113449802001483,0.203209832285431
484
+"Q03344",1,-0.659696754311584,0.19869768463916,-0.869286660601423,1.33028573027385,TRUE,0.683742823585764,0.683742823585764,0.110712724778357,0.205544451635879
485
+"P11762",2,0.488807019107611,-0.25298621879045,1.03735146328237,-1.27317226359953,TRUE,0.68451171717299,0.124215346500733,0.68451171717299,0.191272936326278
486
+"Q9Z1N4",1,-1.23313661054892,0.677449504808424,-0.380199830355978,0.93588693609647,TRUE,0.68503892889652,0.68503892889652,0.116175189069872,0.198785882033608
487
+"P08503",1,-0.87626686802145,0.68111105824002,-0.83762293110798,1.03277874088941,TRUE,0.685702302392209,0.685702302392209,0.10783936286384,0.206458334743951
488
+"P04906",1,-1.21582740418125,0.125221122690545,-0.129742177385399,1.22034845887611,TRUE,0.686269950230909,0.686269950230909,0.123163910297196,0.190566139471894
489
+"O55171",1,-0.903023485685869,0.655863268295714,-0.804818477869452,1.05197869525961,TRUE,0.686853059895532,0.686853059895532,0.110639567338669,0.202507372765799
490
+"Q63862",2,0.517652161163523,-0.748898584457472,1.15110611737193,-0.919859694077984,TRUE,0.687725370076845,0.127245344174804,0.687725370076845,0.185029285748351
491
+"Q63797",2,0.515706069951749,-0.319354385828572,1.0447990119352,-1.24115069605838,TRUE,0.68869913326852,0.123569037833953,0.68869913326852,0.187731828897527
492
+"Q9Z0W7",1,-0.67845705558116,0.081058873824372,-0.78635463795795,1.38375281971474,TRUE,0.690154343424518,0.690154343424518,0.109740420289961,0.200105236285521
493
+"Q9EQP5",2,0.565080295586731,-0.720110165324766,1.11436315883433,-0.959333289096297,TRUE,0.690488711810259,0.126018941368335,0.690488711810259,0.183492346821405
494
+"Q3KR86",1,-1.01463515897453,0.735023183280667,-0.694209895016512,0.973821870710374,TRUE,0.692680810027059,0.692680810027059,0.10770261589511,0.199616574077832
495
+"Q2PQA9",1,-0.895317258570602,0.731349948043854,-0.82633666833981,0.990303978866558,TRUE,0.693618589298861,0.693618589298861,0.101601718915728,0.20477969178541
496
+"Q2PS20",1,-1.24349592392201,0.228326048394248,-0.158110249511984,1.17328012503974,TRUE,0.69415853097674,0.69415853097674,0.119440562298403,0.186400906724857
497
+"P27321",2,0.454757736352876,-0.412211456008723,1.12379716853757,-1.16634344888172,TRUE,0.694577021686845,0.122140797617669,0.694577021686845,0.183282180695487
498
+"P02650",2,0.859635355917474,-0.838417441438135,0.871960628912477,-0.893178543391817,TRUE,0.694678952219144,0.120758240219329,0.694678952219144,0.184562807561526
499
+"Q9Z0J5",1,-0.738642553359736,0.019681706008068,-0.68827132621593,1.4072321735676,TRUE,0.696864375254529,0.696864375254529,0.109866078574673,0.193269546170798
500
+"P23928",1,-0.667348943380565,0.211324108857495,-0.868803014781052,1.32482784930412,TRUE,0.696909540457529,0.696909540457529,0.104688324161821,0.19840213538065
501
+"Q9Z1H9",2,1.05993604832349,-0.653284728971853,0.623436696927137,-1.03008801627877,TRUE,0.69709331860218,0.113692394702321,0.69709331860218,0.1892142866955
502
+"P35738",2,1.01053313280792,-0.707693603981271,0.694788442906673,-0.99762797173332,TRUE,0.697514892895915,0.115861165510953,0.697514892895915,0.186623941593132
503
+"Q64591",1,-0.759303594569315,0.42239534080674,-0.877558932695935,1.21446718645851,TRUE,0.699551034124526,0.699551034124526,0.10580511444298,0.194643851432494
504
+"P48037",2,0.692119996706304,-0.265489505468854,0.872842764207288,-1.29947325544474,TRUE,0.701898434370111,0.114650899370702,0.701898434370111,0.183450666259187
505
+"P15429",2,0.891149985439135,-0.786802945464505,0.83702518561354,-0.941372225588171,TRUE,0.70354147941744,0.116266438695667,0.70354147941744,0.180192081886893
506
+"P02454",2,0.905031785827905,-0.829835769027947,0.825380219196657,-0.900576235996614,TRUE,0.70418243330125,0.115182318273506,0.70418243330125,0.180635248425244
507
+"P62919",1,-1.23244219332935,0.212335398496676,-0.166589411684196,1.18669620651687,TRUE,0.707129335141621,0.707129335141621,0.1132805094581,0.179590155400279
508
+"P67779",1,-1.0883086799354,0.661645853112395,-0.588787155859945,1.01544998268295,TRUE,0.707258008539221,0.707258008539221,0.106919344312789,0.18582264714799
509
+"O35077",1,-0.817883244179259,-0.0123322096863022,-0.581457891974591,1.41167334584015,TRUE,0.707335457262215,0.707335457262215,0.108028732702002,0.184635810035783
510
+"P41565",1,-1.26476488982974,0.42863404896448,-0.24037411133899,1.07650495220425,TRUE,0.707595324735808,0.707595324735808,0.111660310057371,0.180744365206821
511
+"Q5XFX0",2,0.559313372540016,-0.316198543774425,1.00929063514242,-1.25240546390801,TRUE,0.709423449885822,0.113251786505871,0.709423449885822,0.177324763608307
512
+"P13437",1,-0.957407010055961,0.663914884832136,-0.747546962355251,1.04103908757908,TRUE,0.709966096609405,0.709966096609405,0.101763319954088,0.188270583436507
513
+"P05065",1,-1.07735498552758,0.722543094591348,-0.614519547442156,0.969331438378388,TRUE,0.710084465386774,0.710084465386774,0.101754082267162,0.188161452346064
514
+"O35264",2,0.569482358705203,-0.707524707040695,1.10959091884696,-0.971548570511472,TRUE,0.710931170273615,0.116004813812776,0.710931170273615,0.173064015913608
515
+"P15999",1,-0.724107601596488,0.156337599403011,-0.78617232181351,1.35394232400699,TRUE,0.71131875845894,0.71131875845894,0.102300785652858,0.186380455888201
516
+"O70351",1,-1.13823671948862,0.692000516614328,-0.527211519807892,0.973447722682187,TRUE,0.711813580254155,0.711813580254155,0.103315543731089,0.184870876014755
517
+"P10536",1,-1.24610295450899,0.280305504887791,-0.188768564048309,1.15456601366951,TRUE,0.714410369173231,0.714410369173231,0.109673934735882,0.175915696090888
518
+"Q5U216",2,0.98097889447398,-0.536584435478646,0.686377020249097,-1.13077147924443,TRUE,0.714803746079785,0.107505796585259,0.714803746079785,0.177690457334956
519
+"P04764",1,-0.745678613374819,0.113171010050326,-0.739947598144616,1.37245520146911,TRUE,0.715293928543224,0.715293928543224,0.101769136395067,0.182936935061709
520
+"P97852",1,-1.07780380960765,0.619952385548442,-0.592409793227392,1.0502612172866,TRUE,0.71547983970223,0.71547983970223,0.105055297156547,0.179464863141223
521
+"P05545",2,0.634244682656936,-0.563964427654486,1.03191379563016,-1.10219405063261,TRUE,0.717457221191143,0.112593436159697,0.717457221191143,0.16994934264916
522
+"Q9R063",1,-0.793046701978257,0.0413002784052446,-0.645598734183537,1.39734515775655,TRUE,0.717889170005147,0.717889170005147,0.102543070870612,0.179567759124241
523
+"P85834",1,-0.919394786963388,0.0124533169438206,-0.480147689610525,1.38708915963009,TRUE,0.719101006114455,0.719101006114455,0.105733878903052,0.175165114982493
524
+"D3Z9R8",1,-1.00486648641307,0.695434177564073,-0.699315599165439,1.00874790801444,TRUE,0.719309822160961,0.719309822160961,0.0972235858434104,0.183466591995628
525
+"P45592",1,-1.13786951801662,0.115717552643501,-0.253602082848466,1.27575404822158,TRUE,0.719375627080691,0.719375627080691,0.108151380123247,0.172472992796062
526
+"P05544",2,0.854783773442685,-0.63963521802757,0.850827266027975,-1.06597582144309,TRUE,0.719420087956157,0.10980181034028,0.719420087956157,0.170778101703563
527
+"P24090",2,0.921002879400943,-0.661826300703325,0.786968690429269,-1.04614526912689,TRUE,0.720876443644518,0.107576750292977,0.720876443644518,0.171546806062505
528
+"P49242",1,-1.24643486859391,0.402571478858155,-0.25934784118729,1.10321123092304,TRUE,0.721068643702761,0.721068643702761,0.106040734725199,0.172890621572041
529
+"P86252",2,0.909273827400644,-0.457347136781224,0.738903442499646,-1.19083013311907,TRUE,0.721562492314722,0.105406813467902,0.721562492314722,0.173030694217376
530
+"P61016",1,-0.870213552556973,0.0187279315425049,-0.543758029133742,1.39524365014821,TRUE,0.722047287399054,0.722047287399054,0.103163602356847,0.174789110244099
531
+"P62907",1,-1.13878165567612,0.674041911984698,-0.522895752587309,0.987635496278727,TRUE,0.723552886083243,0.723552886083243,0.0987084548322365,0.177738659084521
532
+"P16303",2,0.883516348871785,-0.542782776318995,0.795742947469058,-1.13647652002185,TRUE,0.724187290504631,0.106210506286658,0.724187290504631,0.169602203208711
533
+"P85125",2,0.952077877626545,-0.490741849132921,0.703758196550649,-1.16509422504427,TRUE,0.726491083202878,0.102259470064531,0.726491083202878,0.171249446732591
534
+"P19511",1,-0.770556842626532,0.147975799600781,-0.735261373389242,1.35784241641499,TRUE,0.728818914881143,0.728818914881143,0.0968257809672264,0.17435530415163
535
+"P57093",1,-0.882642589584684,0.056353645865472,-0.555460095647849,1.38174903936706,TRUE,0.728897213206534,0.728897213206534,0.100818384903296,0.170284401890169
536
+"P12001",1,-0.741304427532002,0.367374120806414,-0.872655548572389,1.24658585529798,TRUE,0.729063017625854,0.729063017625854,0.0920726682222308,0.178864314151915
537
+"P21913",2,0.916646946907413,-0.459720418639509,0.731751447608624,-1.18867797587653,TRUE,0.72913500139334,0.101614605349756,0.72913500139334,0.169250393256904
538
+"P10719",1,-0.786139691023282,0.449812982768322,-0.862150879344056,1.19847758759902,TRUE,0.729253126686804,0.729253126686804,0.0927689331822562,0.17797794013094
539
+"P53534",2,0.905235622782682,-0.552303696579053,0.775697001343731,-1.12862892754736,TRUE,0.729423114704089,0.103245858267116,0.729423114704089,0.167331027028795
540
+"Q03626",2,0.955069258540878,-0.598864822802357,0.734521153346977,-1.0907255890855,TRUE,0.731434126779953,0.101206416035241,0.731434126779953,0.167359457184805
541
+"P34058",1,-0.880469794756418,0.616264641983705,-0.819235599602198,1.08344075237491,TRUE,0.732754029315811,0.732754029315811,0.089764466423549,0.17748150426064
542
+"P02767",2,0.83127697537868,-0.468770525776114,0.824611408578162,-1.18711785818073,TRUE,0.73368724734021,0.101823298752033,0.73368724734021,0.164489453907757
543
+"P04904",1,-0.93347486681692,0.600765691983322,-0.758944704393074,1.09165387922667,TRUE,0.736168540887868,0.736168540887868,0.0919663759102566,0.171865083201876
544
+"O89049",1,-0.817860182392178,0.385232243289297,-0.805722569409257,1.23835050851214,TRUE,0.737980924891424,0.737980924891424,0.0929268004883876,0.169092274620189
545
+"P35434",1,-1.04708951247394,0.124468688111093,-0.393820135095721,1.31644095945856,TRUE,0.744873087218522,0.744873087218522,0.0967840237993174,0.158342888982161
546
+"Q60587",1,-1.02967075227574,0.589227304659668,-0.644530873782009,1.08497432139808,TRUE,0.745115582171497,0.745115582171497,0.0918111813489299,0.163073236479573
547
+"Q06647",1,-0.780303928520852,0.282452321514352,-0.796879712332893,1.29473131933939,TRUE,0.747048447067061,0.747048447067061,0.0882142559124024,0.164737297020536
548
+"P15650",1,-0.795880206848633,0.231616172526001,-0.755589451913106,1.31985348623574,TRUE,0.748447802679064,0.748447802679064,0.0889709655402942,0.162581231780642
549
+"Q68FY0",1,-1.07770605707768,0.168151034020481,-0.38087484271676,1.29042986577396,TRUE,0.753664345388305,0.753664345388305,0.0932291733758727,0.153106481235823
550
+"Q6P0K8",1,-1.09670520689619,0.616617043561968,-0.566733083499606,1.04682124683382,TRUE,0.755700462469759,0.755700462469759,0.0865441535201781,0.157755384010063
551
+"Q920F5",1,-1.17357998389218,0.448620496352072,-0.398659712037238,1.12361919957735,TRUE,0.757907440754294,0.757907440754294,0.0900777592577401,0.152014799987966
552
+"P00507",1,-0.988825868867648,0.135902190809088,-0.479080704227237,1.3320043822858,TRUE,0.759920366501961,0.759920366501961,0.0896569385707564,0.150422694927283
553
+"P14668",1,-1.19001824400734,0.38551037015185,-0.343273350932101,1.14778122478759,TRUE,0.76397690509383,0.76397690509383,0.0876331005362986,0.148389994369872
554
+"Q9ER34",1,-0.826115827202921,0.273788106989528,-0.746098277815338,1.29842599802873,TRUE,0.764398156901334,0.764398156901334,0.0831141783149555,0.152487664783711
555
+"A1A5Q0",1,-1.15039305531266,0.294449607372259,-0.354196945170504,1.2101403931109,TRUE,0.765742894283101,0.765742894283101,0.0878547124433992,0.1464023932735
556
+"P20788",1,-0.867043308597393,0.463158767971533,-0.786024959808923,1.18990950043478,TRUE,0.765960867891449,0.765960867891449,0.0808765905672923,0.153162541541259
557
+"Q01205",1,-1.1418561185172,0.30732882492016,-0.374410432636578,1.20893772623362,TRUE,0.767743716770687,0.767743716770687,0.0871257364701878,0.145130546759125
558
+"P35565",1,-0.924063565928439,0.538126552980134,-0.750973401198032,1.13691041414634,TRUE,0.767771664120609,0.767771664120609,0.080154913495675,0.152073422383716
559
+"Q64428",1,-0.995014709681899,0.512494273654496,-0.66175760058014,1.14427803660754,TRUE,0.768869545957507,0.768869545957507,0.0833213508484088,0.147809103194084
560
+"Q5PPN7",1,-1.1399977600744,0.44750348420923,-0.447595282700421,1.14008955856559,TRUE,0.772433448250769,0.772433448250769,0.0840532132968355,0.143513338452396
561
+"P07483",1,-0.941244361708913,0.175625021524125,-0.563268660790767,1.32888800097556,TRUE,0.773055090124861,0.773055090124861,0.0833824206483556,0.143562489226784
562
+"P14408",1,-1.05472822852825,0.209921395148996,-0.439754364387074,1.28456119776633,TRUE,0.777463108439053,0.777463108439053,0.082892002781492,0.139644888779455
563
+"P11442",1,-1.14678650384945,0.383625692534224,-0.407882966087002,1.17104377740222,TRUE,0.777604631445576,0.777604631445576,0.0823516441531317,0.140043724401292
564
+"Q68FR6",1,-1.06320516670404,0.540783469003295,-0.587519319705086,1.10994101740583,TRUE,0.779150182590305,0.779150182590305,0.0788552247936667,0.141994592616028
565
+"P11030",1,-0.87803698546107,0.271649583450281,-0.689631740679857,1.29601914269065,TRUE,0.7796804146664,0.7796804146664,0.078766311371425,0.141553273962175
566
+"Q5XIH7",1,-1.04514420128843,0.489647485054176,-0.592202973285894,1.14769968952015,TRUE,0.780373290665527,0.780373290665527,0.0798099821992184,0.139816727135254
567
+"P23965",1,-1.08508509529279,0.448995249361606,-0.52418083536045,1.16027068129164,TRUE,0.78396455819769,0.78396455819769,0.0793244769393577,0.136710964862953
568
+"P61983",1,-1.03858003819239,0.5232515943483,-0.612616643880163,1.12794508772425,TRUE,0.784075081255365,0.784075081255365,0.0769966946712401,0.138928224073395
569
+"P48500",1,-0.927532600372658,0.467907896730675,-0.722846569651962,1.18247127329394,TRUE,0.784457641286885,0.784457641286885,0.0754985311356303,0.140043827577485
570
+"Q641Z6",1,-1.05037119200368,0.23689913728425,-0.462093865616469,1.2755659203359,TRUE,0.792653775241222,0.792653775241222,0.0763170745561326,0.131029150202646
571
+"P35435",1,-1.06792226947819,0.326731224779647,-0.489086584808912,1.23027762950746,TRUE,0.793789642661013,0.793789642661013,0.0761681277722378,0.130042229566749
572
+"P13803",1,-0.975020115662053,0.452729931055493,-0.662970123758188,1.18526030836475,TRUE,0.794570376744592,0.794570376744592,0.0731424193351936,0.132287203920215
573
+"P48675",1,-0.939820758372308,0.338242965719301,-0.65351208291623,1.25508987556924,TRUE,0.801333823417155,0.801333823417155,0.0710617086581172,0.127604467924727
574
+"Q68FU3",1,-0.980730200900234,0.385564309938494,-0.627727061236256,1.222892952198,TRUE,0.806144719430323,0.806144719430323,0.0695237538792294,0.124331526690447
575
+"Q62920",1,-1.08890601213291,0.414426871184063,-0.50391232109862,1.17839146204747,TRUE,0.811577575425229,0.811577575425229,0.0676194130544097,0.120803011520361
0 576
new file mode 100644
... ...
@@ -0,0 +1,4 @@
1
+"","Mean of log A","Mean of log B","Mean of log C","Mean of log D"
2
+"Cluster 1",-0.822167825061532,0.310048711559405,-0.498227207892318,1.01034632139445
3
+"Cluster 2",0.568289006146469,-0.382664742305108,0.622329223293579,-0.80795348713494
4
+"Cluster 3",0.211815470838793,0.290008852721763,-0.49636971228017,-0.00545461128038652
0 5
new file mode 100644
... ...
@@ -0,0 +1,4 @@
1
+"","Mean of log A","Mean of log B","Mean of log C","Mean of log D"
2
+"Cluster 1",-0.822185661321808,0.310070629671951,-0.498209910344044,1.0103249419939
3
+"Cluster 2",0.56828792528793,-0.382622148966136,0.622323329498616,-0.80798910582041
4
+"Cluster 3",0.211829517749647,0.289928692981705,-0.496419782340443,-0.00533842839090894
... ...
@@ -43,7 +43,7 @@ A. Data sets with different numbers of replicates per condition need to be adapt
43 43
 
44 44
 B. We assume the input data to be of the following format: A1, B1, C1, ..., A2, B2, C2, ..., where letters denote sample type and numbers are the different replicates.
45 45
 
46
-C. If you prefer to estimate feature variance different, use averages and add an estimate for the standard deviation as last column. You will need to set the last option of `statWrapper` to `FALSE`. 
46
+C. If you prefer to estimate feature variance different, use averages and add an estimate for the standard deviation as last column. You will need to set the last option of `PreparedForVSClust` to `FALSE`. 
47 47
 
48 48
 D. If you don't have replicates, use the same format as in C. and set the standard deviations to 1. 
49 49
 
... ...
@@ -81,7 +81,7 @@ Understand more about the data set with `?protein_expressions`
81 81
 
82 82
 This will calculate the false discovery rates for the differentially regulated features (pairwise comparisons versus the first "high fat" condition) and most importantly, their expected individual variances, to be used in the variance-sensitive clustering. These variances can also be uploaded separately via a last column containing them as individual standard deviations.
83 83
 
84
-The `statWrapper` function also creates a PCA plot to assess variability and control whether the samples have been loaded correctly (replicated samples should form groups).
84
+The `PrepareForVSClust` function also creates a PCA plot to assess variability and control whether the samples have been loaded correctly (replicated samples should form groups).
85 85
 
86 86
 After estimating the standard deviations, the matrix consists of the averaged quantitative feature values and a last column for the standard deviations of the features.
87 87
 
... ...
@@ -91,7 +91,7 @@ data(protein_expressions)
91 91
 dat <- protein_expressions
92 92
 
93 93
 #### running statistical analysis and estimation of individual variances
94
-statOut <- statWrapper(dat, NumReps, NumCond, isPaired, TRUE)
94
+statOut <- PrepareForVSClust(dat, NumReps, NumCond, isPaired, TRUE)
95 95
 
96 96
 dat <- statOut$dat
97 97
 Sds <- dat[,ncol(dat)]
... ...
@@ -108,20 +108,23 @@ write.csv(statOut$statFileOut,paste("",Experiment,"statFileOut.csv",sep=""))
108 108
 
109 109
 There is no simple way to find the optimal number of clusters in a data set. For obtaining this number, we run the clustering for different cluster numbers and evaluate them via so-called validity indices, which provide information about suitable cluster numbers. VSClust uses mainly the "Maximum centroid distances" that denotes the shortest distance between any of the centroids. Alternatively, one can inspect the Xie Beni index.
110 110
 
111
-The output of `estimClustNum` contains the suggestion for the number of clusters, the visualization of the two used validity indices, and the data used for the plots.
111
+The output of `estimClustNum` contains the suggestion for the number of clusters, , and the data used for the plots.
112 112
 
113
+We further visualize the outcome.
113 114
 ```{r fig.width = 12}
114 115
 
115 116
 #### Estimate number of clusters with maxClust as maximum number clusters to run 
116 117
 #### the estimation with
117
-clustNumOut <- estimClustNum(dat, maxClust, cores)
118
+ClustInd <- estimClustNum(dat, maxClust, cores)
118 119
 
119 120
 #### Use estimate cluster number or use own
120 121
 if (PreSetNumClustVSClust == 0)
121
-  PreSetNumClustVSClust <- clustNumOut$numclust
122
+  PreSetNumClustVSClust <- optimalClustNum(ClustInd)
122 123
 if (PreSetNumClustStand == 0)
123
-  PreSetNumClustStand <- clustNumOut$numclust
124
-clustNumOut$p
124
+  PreSetNumClustStand <- optimalClustNum(ClustInd, method="FCM")
125
+#### Visualize
126
+  estimClust.plot(ClustInd)
127
+
125 128
 
126 129
 
127 130
 ```
... ...
@@ -186,7 +189,7 @@ Enrichment results are retrieved and visualized with function from `clusterProfi
186 189
 protnames <- rownames(VSClust_cl$membership)
187 190
 names(protnames) <- protnames
188 191
 
189
-enriched <- runFuncEnrich(VSClust_cl, dat, protnames, "UNIPROT_ACCESSION", "KEGG_PATHWAY")
192
+enriched <- runFuncEnrich(VSClust_cl, protnames, "UNIPROT_ACCESSION", "KEGG_PATHWAY")
190 193
 x <- enriched$fullFuncs
191 194
 y <- enriched$redFuncs
192 195
 BHI <- enriched$BHI