knitr::include_graphics("Bioreactor.png")

1 Introduction

Here, some variables of a Bioreactor to Produce Penicillin provided from a Pharmacy company. In Bioeactor, there are a lot of data produced by many sensors. But, not all sensors contribute for Bioreactor performance, furthermore, the data taken every second which means need a lot of storage to keep all data. Creating a model from all variables will spend a lot of time and long computation time. Hence, dimensionality reduction is the objective in this case.

2 Data Import

Import the related library for dimensionality reduction.

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(GGally)
## Loading required package: ggplot2
## Registered S3 method overwritten by 'GGally':
##   method from   
##   +.gg   ggplot2
library(factoextra)
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
library(FactoMineR)

Then import the dataset into a dataframe.

Penicillin <- read.csv("Penicillin.csv")
head(Penicillin,10)
##     X Time..h. Aeration.rate.Fg.L.h. Agitator.RPM.RPM.RPM.
## 1   1      0.2                    30                   100
## 2   2      0.4                    30                   100
## 3   3      0.6                    30                   100
## 4   4      0.8                    30                   100
## 5   5      1.0                    30                   100
## 6   6      1.2                    30                   100
## 7   7      1.4                    30                   100
## 8   8      1.6                    30                   100
## 9   9      1.8                    30                   100
## 10 10      2.0                    30                   100
##    Sugar.feed.rate.Fs.L.h. Acid.flow.rate.Fa.L.h. Base.flow.rate.Fb.L.h.
## 1                        8                 0.0000                30.1180
## 2                        8                 0.0000                51.2210
## 3                        8                 0.0000                54.3020
## 4                        8                 0.0000                37.8160
## 5                        8                 0.5181                18.9080
## 6                        8                 1.0387                 9.4541
## 7                        8                 1.5604                 4.7270
## 8                        8                 2.0823                 2.3635
## 9                        8                 0.0000                 0.0000
## 10                       8                 0.0000                 0.0000
##    Heating.cooling.water.flow.rate.Fc.L.h. Heating.water.flow.rate.Fh.L.h.
## 1                                  9.83350                           1e-04
## 2                                 18.15500                           1e-04
## 3                                  9.59820                           1e-04
## 4                                  4.33950                           1e-04
## 5                                  1.10450                           1e-04
## 6                                  0.00010                           1e-04
## 7                                  0.00010                           1e-04
## 8                                  0.00010                           1e-04
## 9                                  0.00010                           1e-04
## 10                                 0.51077                           1e-04
##    Water.for.injection.dilution.Fw.L.h. Air.head.pressure.pressure.bar.
## 1                                     0                             0.6
## 2                                     0                             0.6
## 3                                     0                             0.6
## 4                                     0                             0.6
## 5                                     0                             0.6
## 6                                     0                             0.6
## 7                                     0                             0.6
## 8                                     0                             0.6
## 9                                     0                             0.6
## 10                                    0                             0.6
##    Dumped.broth.flow.Fremoved.L.h. Substrate.concentration.S.g.L.
## 1                                0                        0.95749
## 2                                0                        1.00460
## 3                                0                        1.04980
## 4                                0                        1.09420
## 5                                0                        1.13700
## 6                                0                        1.17820
## 7                                0                        1.21720
## 8                                0                        1.25440
## 9                                0                        1.28910
## 10                               0                        1.32180
##    Dissolved.oxygen.concentration.DO2.mg.L. Penicillin.concentration.P.g.L.
## 1                                    14.711                      1.0178e-25
## 2                                    14.699                      1.0000e-03
## 3                                    14.686                      9.9934e-04
## 4                                    14.661                      9.9874e-04
## 5                                    14.633                      9.9821e-04
## 6                                    14.621                      9.9771e-04
## 7                                    14.604                      9.9722e-04
## 8                                    14.583                      9.9674e-04
## 9                                    14.547                      9.9627e-04
## 10                                   14.529                      9.9580e-04
##    Vessel.Volume.V.L. Vessel.Weight.Wt.Kg. pH.pH.pH. Temperature.T.K.
## 1               58479                62574    6.4472           298.22
## 2               58487                62585    6.4932           298.17
## 3               58495                62598    6.5425           298.14
## 4               58499                62607    6.5753           298.11
## 5               58501                62613    6.5825           298.09
## 6               58500                62617    6.5717           298.08
## 7               58498                62620    6.5521           298.07
## 8               58497                62622    6.5287           298.06
## 9               58494                62624    6.5061           298.06
## 10              58491                62626    6.4844           298.05
##    Generated.heat.Q.kJ. carbon.dioxide.percent.in.off.gas.CO2outgas...
## 1                 1e-06                                       0.089514
## 2                 1e-06                                       0.101760
## 3                 1e-06                                       0.105800
## 4                 1e-06                                       0.108190
## 5                 1e-06                                       0.110300
## 6                 1e-06                                       0.112420
## 7                 1e-06                                       0.114630
## 8                 1e-06                                       0.116940
## 9                 1e-06                                       0.119360
## 10                1e-06                                       0.121890
##    PAA.flow.Fpaa.PAA.flow..L.h..
## 1                              5
## 2                              5
## 3                              5
## 4                              5
## 5                              5
## 6                              5
## 7                              5
## 8                              5
## 9                              5
## 10                             5
##    PAA.concentration.offline.PAA_offline.PAA..g.L...1... Oil.flow.Foil.L.hr.
## 1                                                     NA                  22
## 2                                                     NA                  22
## 3                                                     NA                  22
## 4                                                     NA                  22
## 5                                                   1488                  22
## 6                                                     NA                  22
## 7                                                     NA                  22
## 8                                                     NA                  22
## 9                                                     NA                  22
## 10                                                    NA                  22
##    NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...
## 1                                                       NA
## 2                                                       NA
## 3                                                       NA
## 4                                                       NA
## 5                                                   1667.8
## 6                                                       NA
## 7                                                       NA
## 8                                                       NA
## 9                                                       NA
## 10                                                      NA
##    Oxygen.Uptake.Rate.OUR..g.min...1...
## 1                             0.4805100
## 2                             0.0581470
## 3                            -0.0415050
## 4                            -0.0567370
## 5                            -0.0499750
## 6                            -0.0452670
## 7                            -0.0393690
## 8                            -0.0310330
## 9                            -0.0160250
## 10                           -0.0071831
##    Oxygen.in.percent.in.off.gas.O2.O2......
## 1                                   0.19595
## 2                                   0.20390
## 3                                   0.20575
## 4                                   0.20602
## 5                                   0.20589
## 6                                   0.20580
## 7                                   0.20569
## 8                                   0.20553
## 9                                   0.20524
## 10                                  0.20507
##    Offline.Penicillin.concentration.P_offline.P.g.L...1...
## 1                                                       NA
## 2                                                       NA
## 3                                                       NA
## 4                                                       NA
## 5                                               1.0178e-25
## 6                                                       NA
## 7                                                       NA
## 8                                                       NA
## 9                                                       NA
## 10                                                      NA
##    Offline.Biomass.concentratio.X_offline.X.g.L...1...
## 1                                                   NA
## 2                                                   NA
## 3                                                   NA
## 4                                                   NA
## 5                                              0.52808
## 6                                                   NA
## 7                                                   NA
## 8                                                   NA
## 9                                                   NA
## 10                                                  NA
##    Carbon.evolution.rate.CER.g.h. Ammonia.shots.NH3_shots.kgs.
## 1                        0.034045                            0
## 2                        0.038702                            0
## 3                        0.040240                            0
## 4                        0.041149                            0
## 5                        0.041951                            0
## 6                        0.042758                            0
## 7                        0.043599                            0
## 8                        0.044478                            0
## 9                        0.045398                            0
## 10                       0.046361                            0
##    Viscosity.Viscosity_offline.centPoise. Fault.reference.Fault_ref.Fault.ref.
## 1                                      NA                                    0
## 2                                      NA                                    0
## 3                                      NA                                    0
## 4                                      NA                                    0
## 5                                   4.083                                    0
## 6                                      NA                                    0
## 7                                      NA                                    0
## 8                                      NA                                    0
## 9                                      NA                                    0
## 10                                     NA                                    0
##    X0...Recipe.driven.1...Operator.controlled.Control_ref.Control.ref.
## 1                                                                    0
## 2                                                                    0
## 3                                                                    0
## 4                                                                    0
## 5                                                                    0
## 6                                                                    0
## 7                                                                    0
## 8                                                                    0
## 9                                                                    0
## 10                                                                   0
##    X1..No.Raman.spec X1.Raman.spec.recorded X2.PAT.control.PAT_ref.PAT.ref.
## 1                  1                      1                               1
## 2                  1                      1                               1
## 3                  1                      1                               1
## 4                  1                      1                               1
## 5                  1                      1                               1
## 6                  1                      1                               1
## 7                  1                      1                               1
## 8                  1                      1                               1
## 9                  1                      1                               1
## 10                 1                      1                               1
##    Batch.reference.Batch_ref.Batch.ref. Batch.ID Fault.flag
## 1                                     0        0          0
## 2                                     0        0          0
## 3                                     0        0          0
## 4                                     0        0          0
## 5                                     0        0          0
## 6                                     0        0          0
## 7                                     0        0          0
## 8                                     0        0          0
## 9                                     0        0          0
## 10                                    0        0          0

As shown below, all variables categorized as double and integer. So, subset from non numeric variables are not required.

glimpse(Penicillin)
## Rows: 200
## Columns: 40
## $ X                                                                   <int> 1,…
## $ Time..h.                                                            <dbl> 0.…
## $ Aeration.rate.Fg.L.h.                                               <int> 30…
## $ Agitator.RPM.RPM.RPM.                                               <int> 10…
## $ Sugar.feed.rate.Fs.L.h.                                             <int> 8,…
## $ Acid.flow.rate.Fa.L.h.                                              <dbl> 0.…
## $ Base.flow.rate.Fb.L.h.                                              <dbl> 30…
## $ Heating.cooling.water.flow.rate.Fc.L.h.                             <dbl> 9.…
## $ Heating.water.flow.rate.Fh.L.h.                                     <dbl> 1e…
## $ Water.for.injection.dilution.Fw.L.h.                                <int> 0,…
## $ Air.head.pressure.pressure.bar.                                     <dbl> 0.…
## $ Dumped.broth.flow.Fremoved.L.h.                                     <int> 0,…
## $ Substrate.concentration.S.g.L.                                      <dbl> 0.…
## $ Dissolved.oxygen.concentration.DO2.mg.L.                            <dbl> 14…
## $ Penicillin.concentration.P.g.L.                                     <dbl> 1.…
## $ Vessel.Volume.V.L.                                                  <int> 58…
## $ Vessel.Weight.Wt.Kg.                                                <int> 62…
## $ pH.pH.pH.                                                           <dbl> 6.…
## $ Temperature.T.K.                                                    <dbl> 29…
## $ Generated.heat.Q.kJ.                                                <dbl> 0.…
## $ carbon.dioxide.percent.in.off.gas.CO2outgas...                      <dbl> 0.…
## $ PAA.flow.Fpaa.PAA.flow..L.h..                                       <int> 5,…
## $ PAA.concentration.offline.PAA_offline.PAA..g.L...1...               <dbl> NA…
## $ Oil.flow.Foil.L.hr.                                                 <int> 22…
## $ NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...             <dbl> NA…
## $ Oxygen.Uptake.Rate.OUR..g.min...1...                                <dbl> 0.…
## $ Oxygen.in.percent.in.off.gas.O2.O2......                            <dbl> 0.…
## $ Offline.Penicillin.concentration.P_offline.P.g.L...1...             <dbl> NA…
## $ Offline.Biomass.concentratio.X_offline.X.g.L...1...                 <dbl> NA…
## $ Carbon.evolution.rate.CER.g.h.                                      <dbl> 0.…
## $ Ammonia.shots.NH3_shots.kgs.                                        <int> 0,…
## $ Viscosity.Viscosity_offline.centPoise.                              <dbl> NA…
## $ Fault.reference.Fault_ref.Fault.ref.                                <int> 0,…
## $ X0...Recipe.driven.1...Operator.controlled.Control_ref.Control.ref. <int> 0,…
## $ X1..No.Raman.spec                                                   <int> 1,…
## $ X1.Raman.spec.recorded                                              <int> 1,…
## $ X2.PAT.control.PAT_ref.PAT.ref.                                     <int> 1,…
## $ Batch.reference.Batch_ref.Batch.ref.                                <int> 0,…
## $ Batch.ID                                                            <int> 0,…
## $ Fault.flag                                                          <int> 0,…

As shown above, not all variables contain data, and some varaibles mostly contain NA. In this case, NA means no indication of sensors like no flow or etc., NA shall be replaced to 0. Some variables like “Fault.reference.Fault_ref.Fault.ref.”,“X0…Recipe.driven.1…Operator.controlled.Control_ref.Control.ref.”, and “Ammonia.shots.NH3_shots.kgs.” removed because entire row contain 0 value.

3 Data Wrangling

For some cell that contain NA, the NA value shall be replced into 0.

Penicillin <- Penicillin %>% 
  select(-c(X,
            Fault.reference.Fault_ref.Fault.ref.,
            X0...Recipe.driven.1...Operator.controlled.Control_ref.Control.ref.,
            Ammonia.shots.NH3_shots.kgs.))


Penicillin <-   replace(Penicillin, is.na(Penicillin), 0)
glimpse(Penicillin)
## Rows: 200
## Columns: 36
## $ Time..h.                                                <dbl> 0.2, 0.4, 0.6,…
## $ Aeration.rate.Fg.L.h.                                   <int> 30, 30, 30, 30…
## $ Agitator.RPM.RPM.RPM.                                   <int> 100, 100, 100,…
## $ Sugar.feed.rate.Fs.L.h.                                 <int> 8, 8, 8, 8, 8,…
## $ Acid.flow.rate.Fa.L.h.                                  <dbl> 0.0000, 0.0000…
## $ Base.flow.rate.Fb.L.h.                                  <dbl> 30.1180, 51.22…
## $ Heating.cooling.water.flow.rate.Fc.L.h.                 <dbl> 9.83350, 18.15…
## $ Heating.water.flow.rate.Fh.L.h.                         <dbl> 1e-04, 1e-04, …
## $ Water.for.injection.dilution.Fw.L.h.                    <int> 0, 0, 0, 0, 0,…
## $ Air.head.pressure.pressure.bar.                         <dbl> 0.6, 0.6, 0.6,…
## $ Dumped.broth.flow.Fremoved.L.h.                         <int> 0, 0, 0, 0, 0,…
## $ Substrate.concentration.S.g.L.                          <dbl> 0.95749, 1.004…
## $ Dissolved.oxygen.concentration.DO2.mg.L.                <dbl> 14.711, 14.699…
## $ Penicillin.concentration.P.g.L.                         <dbl> 1.0178e-25, 1.…
## $ Vessel.Volume.V.L.                                      <int> 58479, 58487, …
## $ Vessel.Weight.Wt.Kg.                                    <int> 62574, 62585, …
## $ pH.pH.pH.                                               <dbl> 6.4472, 6.4932…
## $ Temperature.T.K.                                        <dbl> 298.22, 298.17…
## $ Generated.heat.Q.kJ.                                    <dbl> 0.000001, 0.00…
## $ carbon.dioxide.percent.in.off.gas.CO2outgas...          <dbl> 0.089514, 0.10…
## $ PAA.flow.Fpaa.PAA.flow..L.h..                           <int> 5, 5, 5, 5, 5,…
## $ PAA.concentration.offline.PAA_offline.PAA..g.L...1...   <dbl> 0, 0, 0, 0, 14…
## $ Oil.flow.Foil.L.hr.                                     <int> 22, 22, 22, 22…
## $ NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... <dbl> 0.0, 0.0, 0.0,…
## $ Oxygen.Uptake.Rate.OUR..g.min...1...                    <dbl> 0.48051000, 0.…
## $ Oxygen.in.percent.in.off.gas.O2.O2......                <dbl> 0.19595, 0.203…
## $ Offline.Penicillin.concentration.P_offline.P.g.L...1... <dbl> 0.0000e+00, 0.…
## $ Offline.Biomass.concentratio.X_offline.X.g.L...1...     <dbl> 0.00000, 0.000…
## $ Carbon.evolution.rate.CER.g.h.                          <dbl> 0.034045, 0.03…
## $ Viscosity.Viscosity_offline.centPoise.                  <dbl> 0.000, 0.000, …
## $ X1..No.Raman.spec                                       <int> 1, 1, 1, 1, 1,…
## $ X1.Raman.spec.recorded                                  <int> 1, 1, 1, 1, 1,…
## $ X2.PAT.control.PAT_ref.PAT.ref.                         <int> 1, 1, 1, 1, 1,…
## $ Batch.reference.Batch_ref.Batch.ref.                    <int> 0, 0, 0, 0, 0,…
## $ Batch.ID                                                <int> 0, 0, 0, 0, 0,…
## $ Fault.flag                                              <int> 0, 0, 0, 0, 0,…
Penicillin %>% is.na() %>% colSums()
##                                                Time..h. 
##                                                       0 
##                                   Aeration.rate.Fg.L.h. 
##                                                       0 
##                                   Agitator.RPM.RPM.RPM. 
##                                                       0 
##                                 Sugar.feed.rate.Fs.L.h. 
##                                                       0 
##                                  Acid.flow.rate.Fa.L.h. 
##                                                       0 
##                                  Base.flow.rate.Fb.L.h. 
##                                                       0 
##                 Heating.cooling.water.flow.rate.Fc.L.h. 
##                                                       0 
##                         Heating.water.flow.rate.Fh.L.h. 
##                                                       0 
##                    Water.for.injection.dilution.Fw.L.h. 
##                                                       0 
##                         Air.head.pressure.pressure.bar. 
##                                                       0 
##                         Dumped.broth.flow.Fremoved.L.h. 
##                                                       0 
##                          Substrate.concentration.S.g.L. 
##                                                       0 
##                Dissolved.oxygen.concentration.DO2.mg.L. 
##                                                       0 
##                         Penicillin.concentration.P.g.L. 
##                                                       0 
##                                      Vessel.Volume.V.L. 
##                                                       0 
##                                    Vessel.Weight.Wt.Kg. 
##                                                       0 
##                                               pH.pH.pH. 
##                                                       0 
##                                        Temperature.T.K. 
##                                                       0 
##                                    Generated.heat.Q.kJ. 
##                                                       0 
##          carbon.dioxide.percent.in.off.gas.CO2outgas... 
##                                                       0 
##                           PAA.flow.Fpaa.PAA.flow..L.h.. 
##                                                       0 
##   PAA.concentration.offline.PAA_offline.PAA..g.L...1... 
##                                                       0 
##                                     Oil.flow.Foil.L.hr. 
##                                                       0 
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... 
##                                                       0 
##                    Oxygen.Uptake.Rate.OUR..g.min...1... 
##                                                       0 
##                Oxygen.in.percent.in.off.gas.O2.O2...... 
##                                                       0 
## Offline.Penicillin.concentration.P_offline.P.g.L...1... 
##                                                       0 
##     Offline.Biomass.concentratio.X_offline.X.g.L...1... 
##                                                       0 
##                          Carbon.evolution.rate.CER.g.h. 
##                                                       0 
##                  Viscosity.Viscosity_offline.centPoise. 
##                                                       0 
##                                       X1..No.Raman.spec 
##                                                       0 
##                                  X1.Raman.spec.recorded 
##                                                       0 
##                         X2.PAT.control.PAT_ref.PAT.ref. 
##                                                       0 
##                    Batch.reference.Batch_ref.Batch.ref. 
##                                                       0 
##                                                Batch.ID 
##                                                       0 
##                                              Fault.flag 
##                                                       0
summary(Penicillin)
##     Time..h.      Aeration.rate.Fg.L.h. Agitator.RPM.RPM.RPM.
##  Min.   :  0.20   Min.   :30.0          Min.   :100          
##  1st Qu.: 10.15   1st Qu.:42.0          1st Qu.:100          
##  Median :115.10   Median :53.5          Median :100          
##  Mean   :115.10   Mean   :51.1          Mean   :100          
##  3rd Qu.:220.05   3rd Qu.:65.0          3rd Qu.:100          
##  Max.   :230.00   Max.   :65.0          Max.   :100          
##  Sugar.feed.rate.Fs.L.h. Acid.flow.rate.Fa.L.h. Base.flow.rate.Fb.L.h.
##  Min.   : 8.00           Min.   :0.0000         Min.   : 0.000        
##  1st Qu.:15.00           1st Qu.:0.0000         1st Qu.: 7.347        
##  Median :77.50           Median :0.0000         Median :17.698        
##  Mean   :54.48           Mean   :0.1973         Mean   :22.423        
##  3rd Qu.:80.00           3rd Qu.:0.0000         3rd Qu.:35.402        
##  Max.   :80.00           Max.   :5.7182         Max.   :64.596        
##  Heating.cooling.water.flow.rate.Fc.L.h. Heating.water.flow.rate.Fh.L.h.
##  Min.   :  0.0001                        Min.   :  0.0001               
##  1st Qu.: 14.6807                        1st Qu.:  0.0001               
##  Median : 51.4815                        Median :  0.1514               
##  Mean   : 67.1249                        Mean   : 19.3792               
##  3rd Qu.:104.6600                        3rd Qu.: 10.6500               
##  Max.   :271.7500                        Max.   :171.3100               
##  Water.for.injection.dilution.Fw.L.h. Air.head.pressure.pressure.bar.
##  Min.   :  0                          Min.   :0.600                  
##  1st Qu.:  0                          1st Qu.:0.600                  
##  Median :125                          Median :0.800                  
##  Mean   :125                          Mean   :0.769                  
##  3rd Qu.:250                          3rd Qu.:0.900                  
##  Max.   :250                          Max.   :0.900                  
##  Dumped.broth.flow.Fremoved.L.h. Substrate.concentration.S.g.L.
##  Min.   :-4000                   Min.   : 0.00996              
##  1st Qu.:    0                   1st Qu.: 1.04950              
##  Median :    0                   Median :34.28875              
##  Mean   : -200                   Mean   :35.35527              
##  3rd Qu.:    0                   3rd Qu.:69.85250              
##  Max.   :    0                   Max.   :72.97900              
##  Dissolved.oxygen.concentration.DO2.mg.L. Penicillin.concentration.P.g.L.
##  Min.   :11.56                            Min.   :0.000000               
##  1st Qu.:13.03                            1st Qu.:0.000972               
##  Median :13.27                            Median :2.813650               
##  Mean   :13.21                            Mean   :3.014867               
##  3rd Qu.:13.39                            3rd Qu.:6.019825               
##  Max.   :14.71                            Max.   :6.454000               
##  Vessel.Volume.V.L. Vessel.Weight.Wt.Kg.   pH.pH.pH.     Temperature.T.K.
##  Min.   :58479      Min.   :62574        Min.   :6.447   Min.   :297.9   
##  1st Qu.:58618      1st Qu.:62995        1st Qu.:6.491   1st Qu.:298.0   
##  Median :63972      Median :71106        Median :6.502   Median :298.1   
##  Mean   :65122      Mean   :72234        Mean   :6.508   Mean   :298.0   
##  3rd Qu.:71523      3rd Qu.:81350        3rd Qu.:6.514   3rd Qu.:298.1   
##  Max.   :74552      Max.   :84764        Max.   :6.647   Max.   :298.6   
##  Generated.heat.Q.kJ. carbon.dioxide.percent.in.off.gas.CO2outgas...
##  Min.   :  0.00       Min.   :0.08951                               
##  1st Qu.: 12.87       1st Qu.:0.26657                               
##  Median :192.31       Median :0.92810                               
##  Mean   :135.55       Mean   :0.77052                               
##  3rd Qu.:240.80       3rd Qu.:1.21920                               
##  Max.   :323.36       Max.   :1.35120                               
##  PAA.flow.Fpaa.PAA.flow..L.h..
##  Min.   :0.000                
##  1st Qu.:0.000                
##  Median :4.000                
##  Mean   :2.625                
##  3rd Qu.:4.000                
##  Max.   :5.000                
##  PAA.concentration.offline.PAA_offline.PAA..g.L...1... Oil.flow.Foil.L.hr.
##  Min.   :   0.0                                        Min.   :22.0       
##  1st Qu.:   0.0                                        1st Qu.:23.0       
##  Median :   0.0                                        Median :23.0       
##  Mean   : 139.1                                        Mean   :26.2       
##  3rd Qu.:   0.0                                        3rd Qu.:30.0       
##  Max.   :8254.5                                        Max.   :35.0       
##  NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...
##  Min.   :   0.00                                        
##  1st Qu.:   0.00                                        
##  Median :   0.00                                        
##  Mean   :  73.55                                        
##  3rd Qu.:   0.00                                        
##  Max.   :3755.60                                        
##  Oxygen.Uptake.Rate.OUR..g.min...1... Oxygen.in.percent.in.off.gas.O2.O2......
##  Min.   :-0.05674                     Min.   :0.1889                          
##  1st Qu.: 0.26927                     1st Qu.:0.1963                          
##  Median : 0.32342                     Median :0.1999                          
##  Mean   : 0.42538                     Mean   :0.1985                          
##  3rd Qu.: 0.58850                     3rd Qu.:0.2004                          
##  Max.   : 1.10910                     Max.   :0.2060                          
##  Offline.Penicillin.concentration.P_offline.P.g.L...1...
##  Min.   :0.00000                                        
##  1st Qu.:0.00000                                        
##  Median :0.00000                                        
##  Mean   :0.08812                                        
##  3rd Qu.:0.00000                                        
##  Max.   :6.23260                                        
##  Offline.Biomass.concentratio.X_offline.X.g.L...1...
##  Min.   : 0.0000                                    
##  1st Qu.: 0.0000                                    
##  Median : 0.0000                                    
##  Mean   : 0.2761                                    
##  3rd Qu.: 0.0000                                    
##  Max.   :17.9210                                    
##  Carbon.evolution.rate.CER.g.h. Viscosity.Viscosity_offline.centPoise.
##  Min.   :0.03404                Min.   :  0.000                       
##  1st Qu.:0.14162                1st Qu.:  0.000                       
##  Median :0.67132                Median :  0.000                       
##  Mean   :0.58549                Mean   :  1.838                       
##  3rd Qu.:1.00778                3rd Qu.:  0.000                       
##  Max.   :1.11730                Max.   :117.930                       
##  X1..No.Raman.spec X1.Raman.spec.recorded X2.PAT.control.PAT_ref.PAT.ref.
##  Min.   :1         Min.   :  1.0          Min.   :  1.0                  
##  1st Qu.:1         1st Qu.:  1.0          1st Qu.:  1.0                  
##  Median :1         Median : 50.5          Median : 50.5                  
##  Mean   :1         Mean   : 50.5          Mean   : 50.5                  
##  3rd Qu.:1         3rd Qu.:100.0          3rd Qu.:100.0                  
##  Max.   :1         Max.   :100.0          Max.   :100.0                  
##  Batch.reference.Batch_ref.Batch.ref.    Batch.ID       Fault.flag   
##  Min.   :0.0                          Min.   :    0   Min.   :    0  
##  1st Qu.:0.0                          1st Qu.:21511   1st Qu.:21564  
##  Median :0.5                          Median :33056   Median :33321  
##  Mean   :0.5                          Mean   :32906   Mean   :32936  
##  3rd Qu.:1.0                          3rd Qu.:46270   3rd Qu.:46428  
##  Max.   :1.0                          Max.   :48990   Max.   :49343

All variables then already contain positive value, free from NA value and constant/zero variance variable.

names(Penicillin[, sapply(Penicillin, function(v) var(v, na.rm=TRUE)==0)])
## [1] "Agitator.RPM.RPM.RPM." "X1..No.Raman.spec"

Unfortunately, due to some variables contain NA. Those variables are “Agitator.RPM.RPM.RPM.”, “X1..No.Raman.spec”, which cannot rescale because this column identified as constant/zero column to unit variance, removing those variables are needed.

Penicillin_clean <- Penicillin %>% select(-c(Agitator.RPM.RPM.RPM.,X1..No.Raman.spec))

Then, all varaibles shall be converted into same scale to reduce potential to extreme dominance of a variable.

Penicillin_scaled <- scale(Penicillin_clean)
summary(Penicillin_scaled)
##     Time..h.       Aeration.rate.Fg.L.h. Sugar.feed.rate.Fs.L.h.
##  Min.   :-1.0899   Min.   :-1.4507       Min.   :-1.5117        
##  1st Qu.:-0.9955   1st Qu.:-0.6257       1st Qu.:-1.2840        
##  Median : 0.0000   Median : 0.1650       Median : 0.7490        
##  Mean   : 0.0000   Mean   : 0.0000       Mean   : 0.0000        
##  3rd Qu.: 0.9955   3rd Qu.: 0.9557       3rd Qu.: 0.8303        
##  Max.   : 1.0899   Max.   : 0.9557       Max.   : 0.8303        
##  Acid.flow.rate.Fa.L.h. Base.flow.rate.Fb.L.h.
##  Min.   :-0.238         Min.   :-1.2184       
##  1st Qu.:-0.238         1st Qu.:-0.8192       
##  Median :-0.238         Median :-0.2567       
##  Mean   : 0.000         Mean   : 0.0000       
##  3rd Qu.:-0.238         3rd Qu.: 0.7052       
##  Max.   : 6.659         Max.   : 2.2915       
##  Heating.cooling.water.flow.rate.Fc.L.h. Heating.water.flow.rate.Fh.L.h.
##  Min.   :-1.1582                         Min.   :-0.5359                
##  1st Qu.:-0.9049                         1st Qu.:-0.5359                
##  Median :-0.2699                         Median :-0.5317                
##  Mean   : 0.0000                         Mean   : 0.0000                
##  3rd Qu.: 0.6477                         3rd Qu.:-0.2414                
##  Max.   : 3.5308                         Max.   : 4.2015                
##  Water.for.injection.dilution.Fw.L.h. Air.head.pressure.pressure.bar.
##  Min.   :-0.9975                      Min.   :-1.2448                
##  1st Qu.:-0.9975                      1st Qu.:-1.2448                
##  Median : 0.0000                      Median : 0.2283                
##  Mean   : 0.0000                      Mean   : 0.0000                
##  3rd Qu.: 0.9975                      3rd Qu.: 0.9649                
##  Max.   : 0.9975                      Max.   : 0.9649                
##  Dumped.broth.flow.Fremoved.L.h. Substrate.concentration.S.g.L.
##  Min.   :-4.3480                 Min.   :-1.02166              
##  1st Qu.: 0.2288                 1st Qu.:-0.99162              
##  Median : 0.2288                 Median :-0.03083              
##  Mean   : 0.0000                 Mean   : 0.00000              
##  3rd Qu.: 0.2288                 3rd Qu.: 0.99715              
##  Max.   : 0.2288                 Max.   : 1.08752              
##  Dissolved.oxygen.concentration.DO2.mg.L. Penicillin.concentration.P.g.L.
##  Min.   :-2.39842                         Min.   :-0.99621               
##  1st Qu.:-0.26360                         1st Qu.:-0.99588               
##  Median : 0.08516                         Median :-0.06649               
##  Mean   : 0.00000                         Mean   : 0.00000               
##  3rd Qu.: 0.26100                         3rd Qu.: 0.99293               
##  Max.   : 2.18867                         Max.   : 1.13640               
##  Vessel.Volume.V.L. Vessel.Weight.Wt.Kg.   pH.pH.pH.       Temperature.T.K. 
##  Min.   :-1.0144    Min.   :-1.0424      Min.   :-2.0716   Min.   :-1.8211  
##  1st Qu.:-0.9932    1st Qu.:-0.9970      1st Qu.:-0.5800   1st Qu.:-0.7394  
##  Median :-0.1757    Median :-0.1217      Median :-0.1986   Median : 0.1455  
##  Mean   : 0.0000    Mean   : 0.0000      Mean   : 0.0000   Mean   : 0.0000  
##  3rd Qu.: 0.9773    3rd Qu.: 0.9837      3rd Qu.: 0.1912   3rd Qu.: 0.5388  
##  Max.   : 1.4399    Max.   : 1.3522      Max.   : 4.6950   Max.   : 5.2587  
##  Generated.heat.Q.kJ. carbon.dioxide.percent.in.off.gas.CO2outgas...
##  Min.   :-1.1748      Min.   :-1.4477                               
##  1st Qu.:-1.0633      1st Qu.:-1.0713                               
##  Median : 0.4920      Median : 0.3350                               
##  Mean   : 0.0000      Mean   : 0.0000                               
##  3rd Qu.: 0.9123      3rd Qu.: 0.9539                               
##  Max.   : 1.6278      Max.   : 1.2345                               
##  PAA.flow.Fpaa.PAA.flow..L.h..
##  Min.   :-1.2725              
##  1st Qu.:-1.2725              
##  Median : 0.6665              
##  Mean   : 0.0000              
##  3rd Qu.: 0.6665              
##  Max.   : 1.1513              
##  PAA.concentration.offline.PAA_offline.PAA..g.L...1... Oil.flow.Foil.L.hr.
##  Min.   :-0.137                                        Min.   :-0.9621    
##  1st Qu.:-0.137                                        1st Qu.:-0.7331    
##  Median :-0.137                                        Median :-0.7331    
##  Mean   : 0.000                                        Mean   : 0.0000    
##  3rd Qu.:-0.137                                        3rd Qu.: 0.8705    
##  Max.   : 7.993                                        Max.   : 2.0159    
##  NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...
##  Min.   :-0.1512                                        
##  1st Qu.:-0.1512                                        
##  Median :-0.1512                                        
##  Mean   : 0.0000                                        
##  3rd Qu.:-0.1512                                        
##  Max.   : 7.5680                                        
##  Oxygen.Uptake.Rate.OUR..g.min...1... Oxygen.in.percent.in.off.gas.O2.O2......
##  Min.   :-1.7145                      Min.   :-2.4729                         
##  1st Qu.:-0.5552                      1st Qu.:-0.5541                         
##  Median :-0.3626                      Median : 0.3679                         
##  Mean   : 0.0000                      Mean   : 0.0000                         
##  3rd Qu.: 0.5801                      3rd Qu.: 0.4846                         
##  Max.   : 2.4315                      Max.   : 1.9450                         
##  Offline.Penicillin.concentration.P_offline.P.g.L...1...
##  Min.   :-0.123                                         
##  1st Qu.:-0.123                                         
##  Median :-0.123                                         
##  Mean   : 0.000                                         
##  3rd Qu.:-0.123                                         
##  Max.   : 8.575                                         
##  Offline.Biomass.concentratio.X_offline.X.g.L...1...
##  Min.   :-0.1307                                    
##  1st Qu.:-0.1307                                    
##  Median :-0.1307                                    
##  Mean   : 0.0000                                    
##  3rd Qu.:-0.1307                                    
##  Max.   : 8.3522                                    
##  Carbon.evolution.rate.CER.g.h. Viscosity.Viscosity_offline.centPoise.
##  Min.   :-1.2710                Min.   :-0.1282                       
##  1st Qu.:-1.0230                1st Qu.:-0.1282                       
##  Median : 0.1978                Median :-0.1282                       
##  Mean   : 0.0000                Mean   : 0.0000                       
##  3rd Qu.: 0.9733                3rd Qu.:-0.1282                       
##  Max.   : 1.2257                Max.   : 8.0961                       
##  X1.Raman.spec.recorded X2.PAT.control.PAT_ref.PAT.ref.
##  Min.   :-0.9975        Min.   :-0.9975                
##  1st Qu.:-0.9975        1st Qu.:-0.9975                
##  Median : 0.0000        Median : 0.0000                
##  Mean   : 0.0000        Mean   : 0.0000                
##  3rd Qu.: 0.9975        3rd Qu.: 0.9975                
##  Max.   : 0.9975        Max.   : 0.9975                
##  Batch.reference.Batch_ref.Batch.ref.    Batch.ID          Fault.flag      
##  Min.   :-0.9975                      Min.   :-2.29996   Min.   :-2.29886  
##  1st Qu.:-0.9975                      1st Qu.:-0.79650   1st Qu.:-0.79376  
##  Median : 0.0000                      Median : 0.01046   Median : 0.02686  
##  Mean   : 0.0000                      Mean   : 0.00000   Mean   : 0.00000  
##  3rd Qu.: 0.9975                      3rd Qu.: 0.93400   3rd Qu.: 0.94177  
##  Max.   : 0.9975                      Max.   : 1.12415   Max.   : 1.14521

4 Scaling Variables

plot(prcomp(Penicillin_scaled))

Transform date set to pca used prcomp funtion and below the sd, rotation and projection of each PC.

prcomp(Penicillin_scaled)
## Standard deviations (1, .., p=34):
##  [1] 4.358686e+00 2.205296e+00 2.100134e+00 1.418142e+00 1.166698e+00
##  [6] 8.085847e-01 6.500733e-01 5.784470e-01 5.028894e-01 4.349995e-01
## [11] 3.567104e-01 3.350405e-01 2.712734e-01 2.447796e-01 2.091135e-01
## [16] 1.934269e-01 1.381817e-01 1.366587e-01 6.953700e-02 4.144815e-02
## [21] 3.368249e-02 3.240153e-02 2.995979e-02 2.311646e-02 1.546378e-02
## [26] 1.363907e-02 3.017046e-03 1.505562e-03 7.818226e-04 5.366227e-05
## [31] 1.367838e-05 4.210701e-16 4.210701e-16 4.210701e-16
## 
## Rotation (n x k) = (34 x 34):
##                                                                 PC1
## Time..h.                                                 0.22770584
## Aeration.rate.Fg.L.h.                                    0.21625494
## Sugar.feed.rate.Fs.L.h.                                  0.18791620
## Acid.flow.rate.Fa.L.h.                                   0.04524415
## Base.flow.rate.Fb.L.h.                                  -0.16832698
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.13267186
## Heating.water.flow.rate.Fh.L.h.                          0.10860797
## Water.for.injection.dilution.Fw.L.h.                     0.22839846
## Air.head.pressure.pressure.bar.                          0.22084594
## Dumped.broth.flow.Fremoved.L.h.                         -0.05818216
## Substrate.concentration.S.g.L.                           0.22820718
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.01699940
## Penicillin.concentration.P.g.L.                          0.22811631
## Vessel.Volume.V.L.                                       0.22492886
## Vessel.Weight.Wt.Kg.                                     0.22609929
## pH.pH.pH.                                                0.04783488
## Temperature.T.K.                                        -0.12103745
## Generated.heat.Q.kJ.                                     0.22089665
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.21999985
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.16183831
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.03279132
## Oil.flow.Foil.L.hr.                                     -0.17494631
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.02621682
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.10089045
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.10026949
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.03656895
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.03441640
## Carbon.evolution.rate.CER.g.h.                           0.22463193
## Viscosity.Viscosity_offline.centPoise.                   0.03531000
## X1.Raman.spec.recorded                                   0.22839846
## X2.PAT.control.PAT_ref.PAT.ref.                          0.22839846
## Batch.reference.Batch_ref.Batch.ref.                     0.22839846
## Batch.ID                                                 0.21474923
## Fault.flag                                               0.21466435
##                                                                  PC2
## Time..h.                                                -0.013569704
## Aeration.rate.Fg.L.h.                                   -0.017540578
## Sugar.feed.rate.Fs.L.h.                                 -0.021410561
## Acid.flow.rate.Fa.L.h.                                  -0.043978179
## Base.flow.rate.Fb.L.h.                                   0.006316711
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.003390360
## Heating.water.flow.rate.Fh.L.h.                          0.009200547
## Water.for.injection.dilution.Fw.L.h.                    -0.016036621
## Air.head.pressure.pressure.bar.                         -0.019063856
## Dumped.broth.flow.Fremoved.L.h.                          0.049567917
## Substrate.concentration.S.g.L.                          -0.013083921
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.015731993
## Penicillin.concentration.P.g.L.                         -0.020242944
## Vessel.Volume.V.L.                                      -0.005733205
## Vessel.Weight.Wt.Kg.                                    -0.008072996
## pH.pH.pH.                                               -0.058057137
## Temperature.T.K.                                         0.014709574
## Generated.heat.Q.kJ.                                    -0.015241275
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.020927617
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.004138840
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.447758597
## Oil.flow.Foil.L.hr.                                      0.002757476
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.437072868
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.006296079
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.005729786
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.443015637
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.446674806
## Carbon.evolution.rate.CER.g.h.                          -0.019762235
## Viscosity.Viscosity_offline.centPoise.                   0.445935164
## X1.Raman.spec.recorded                                  -0.016036621
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.016036621
## Batch.reference.Batch_ref.Batch.ref.                    -0.016036621
## Batch.ID                                                -0.025455344
## Fault.flag                                              -0.025518573
##                                                                  PC3
## Time..h.                                                 0.041384471
## Aeration.rate.Fg.L.h.                                    0.136324640
## Sugar.feed.rate.Fs.L.h.                                  0.223741196
## Acid.flow.rate.Fa.L.h.                                  -0.040044762
## Base.flow.rate.Fb.L.h.                                   0.213223346
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.318861006
## Heating.water.flow.rate.Fh.L.h.                          0.003051813
## Water.for.injection.dilution.Fw.L.h.                     0.024745266
## Air.head.pressure.pressure.bar.                          0.099547498
## Dumped.broth.flow.Fremoved.L.h.                         -0.026474207
## Substrate.concentration.S.g.L.                           0.019268374
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.457431998
## Penicillin.concentration.P.g.L.                          0.025483280
## Vessel.Volume.V.L.                                       0.033832170
## Vessel.Weight.Wt.Kg.                                     0.037844554
## pH.pH.pH.                                               -0.048330696
## Temperature.T.K.                                        -0.014311294
## Generated.heat.Q.kJ.                                     0.065956997
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.127908123
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.272002435
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.010727245
## Oil.flow.Foil.L.hr.                                      0.273698652
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.004999218
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.418614101
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.419555604
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.014679296
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.017593882
## Carbon.evolution.rate.CER.g.h.                           0.091467641
## Viscosity.Viscosity_offline.centPoise.                   0.015415293
## X1.Raman.spec.recorded                                   0.024745266
## X2.PAT.control.PAT_ref.PAT.ref.                          0.024745266
## Batch.reference.Batch_ref.Batch.ref.                     0.024745266
## Batch.ID                                                 0.105283003
## Fault.flag                                               0.105952543
##                                                                   PC4
## Time..h.                                                 0.0376662634
## Aeration.rate.Fg.L.h.                                    0.0195751907
## Sugar.feed.rate.Fs.L.h.                                  0.0154334884
## Acid.flow.rate.Fa.L.h.                                  -0.5343101828
## Base.flow.rate.Fb.L.h.                                   0.0671366580
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.0181085452
## Heating.water.flow.rate.Fh.L.h.                         -0.0970143633
## Water.for.injection.dilution.Fw.L.h.                     0.0228744673
## Air.head.pressure.pressure.bar.                          0.0194621614
## Dumped.broth.flow.Fremoved.L.h.                          0.5188019939
## Substrate.concentration.S.g.L.                           0.0375775332
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.0598165813
## Penicillin.concentration.P.g.L.                          0.0008449866
## Vessel.Volume.V.L.                                       0.0531046332
## Vessel.Weight.Wt.Kg.                                     0.0468210063
## pH.pH.pH.                                               -0.6234959038
## Temperature.T.K.                                        -0.1263224650
## Generated.heat.Q.kJ.                                    -0.0096524075
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0046185345
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.0036456960
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.0379010332
## Oil.flow.Foil.L.hr.                                     -0.0089061164
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.0482690105
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.0550879319
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.0318492482
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.0290159828
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0315018085
## Carbon.evolution.rate.CER.g.h.                           0.0065998913
## Viscosity.Viscosity_offline.centPoise.                  -0.0314555190
## X1.Raman.spec.recorded                                   0.0228744673
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0228744673
## Batch.reference.Batch_ref.Batch.ref.                     0.0228744673
## Batch.ID                                                 0.0222688640
## Fault.flag                                               0.0224685888
##                                                                  PC5
## Time..h.                                                -0.006533934
## Aeration.rate.Fg.L.h.                                    0.007501678
## Sugar.feed.rate.Fs.L.h.                                 -0.014524099
## Acid.flow.rate.Fa.L.h.                                  -0.184566780
## Base.flow.rate.Fb.L.h.                                   0.014129155
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.095407998
## Heating.water.flow.rate.Fh.L.h.                          0.699218207
## Water.for.injection.dilution.Fw.L.h.                    -0.008585032
## Air.head.pressure.pressure.bar.                          0.005740708
## Dumped.broth.flow.Fremoved.L.h.                          0.005576110
## Substrate.concentration.S.g.L.                          -0.007676034
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.025758154
## Penicillin.concentration.P.g.L.                         -0.010752247
## Vessel.Volume.V.L.                                       0.002847072
## Vessel.Weight.Wt.Kg.                                     0.000569354
## pH.pH.pH.                                               -0.074736660
## Temperature.T.K.                                         0.653248431
## Generated.heat.Q.kJ.                                     0.171725273
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.008406209
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.051243973
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.013371214
## Oil.flow.Foil.L.hr.                                      0.021286928
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.020697243
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.011592422
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.013050378
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.007890513
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.011115631
## Carbon.evolution.rate.CER.g.h.                          -0.007356829
## Viscosity.Viscosity_offline.centPoise.                  -0.009788268
## X1.Raman.spec.recorded                                  -0.008585032
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.008585032
## Batch.reference.Batch_ref.Batch.ref.                    -0.008585032
## Batch.ID                                                -0.002087435
## Fault.flag                                              -0.001048552
##                                                                  PC6
## Time..h.                                                 0.012458598
## Aeration.rate.Fg.L.h.                                    0.019927517
## Sugar.feed.rate.Fs.L.h.                                  0.084001301
## Acid.flow.rate.Fa.L.h.                                   0.634501845
## Base.flow.rate.Fb.L.h.                                   0.064712581
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.153236637
## Heating.water.flow.rate.Fh.L.h.                          0.173034518
## Water.for.injection.dilution.Fw.L.h.                     0.004005011
## Air.head.pressure.pressure.bar.                          0.032693183
## Dumped.broth.flow.Fremoved.L.h.                          0.715680253
## Substrate.concentration.S.g.L.                           0.006870687
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.055869896
## Penicillin.concentration.P.g.L.                         -0.003182546
## Vessel.Volume.V.L.                                      -0.068273056
## Vessel.Weight.Wt.Kg.                                    -0.052058357
## pH.pH.pH.                                                0.026955826
## Temperature.T.K.                                        -0.034326417
## Generated.heat.Q.kJ.                                     0.009117316
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.006030151
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.007906023
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.001674480
## Oil.flow.Foil.L.hr.                                      0.046047373
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.003203402
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.024550490
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.033104113
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.004287098
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.003917991
## Carbon.evolution.rate.CER.g.h.                          -0.002009488
## Viscosity.Viscosity_offline.centPoise.                  -0.004535153
## X1.Raman.spec.recorded                                   0.004005011
## X2.PAT.control.PAT_ref.PAT.ref.                          0.004005011
## Batch.reference.Batch_ref.Batch.ref.                     0.004005011
## Batch.ID                                                -0.033304345
## Fault.flag                                              -0.034942561
##                                                                  PC7
## Time..h.                                                -0.014718396
## Aeration.rate.Fg.L.h.                                   -0.055232713
## Sugar.feed.rate.Fs.L.h.                                  0.214304503
## Acid.flow.rate.Fa.L.h.                                  -0.238481494
## Base.flow.rate.Fb.L.h.                                   0.533011470
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.465634085
## Heating.water.flow.rate.Fh.L.h.                          0.209563544
## Water.for.injection.dilution.Fw.L.h.                    -0.021613684
## Air.head.pressure.pressure.bar.                          0.017661664
## Dumped.broth.flow.Fremoved.L.h.                         -0.053836315
## Substrate.concentration.S.g.L.                          -0.022671093
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.096595287
## Penicillin.concentration.P.g.L.                         -0.027833286
## Vessel.Volume.V.L.                                       0.029830922
## Vessel.Weight.Wt.Kg.                                     0.020709369
## pH.pH.pH.                                                0.226972701
## Temperature.T.K.                                        -0.289273760
## Generated.heat.Q.kJ.                                    -0.092361113
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.037573124
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.332611670
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.007227411
## Oil.flow.Foil.L.hr.                                     -0.023273001
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.054257925
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.102995435
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.082540951
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.024543966
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.011734992
## Carbon.evolution.rate.CER.g.h.                           0.015078019
## Viscosity.Viscosity_offline.centPoise.                  -0.017300672
## X1.Raman.spec.recorded                                  -0.021613684
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.021613684
## Batch.reference.Batch_ref.Batch.ref.                    -0.021613684
## Batch.ID                                                -0.164640331
## Fault.flag                                              -0.164261585
##                                                                  PC8
## Time..h.                                                 0.061508759
## Aeration.rate.Fg.L.h.                                    0.133183113
## Sugar.feed.rate.Fs.L.h.                                 -0.075722633
## Acid.flow.rate.Fa.L.h.                                  -0.145875251
## Base.flow.rate.Fb.L.h.                                   0.398866829
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.468240103
## Heating.water.flow.rate.Fh.L.h.                         -0.244972633
## Water.for.injection.dilution.Fw.L.h.                     0.057315094
## Air.head.pressure.pressure.bar.                          0.023639184
## Dumped.broth.flow.Fremoved.L.h.                          0.277077211
## Substrate.concentration.S.g.L.                           0.061681911
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.036602678
## Penicillin.concentration.P.g.L.                          0.044137078
## Vessel.Volume.V.L.                                       0.043139423
## Vessel.Weight.Wt.Kg.                                     0.044568673
## pH.pH.pH.                                                0.392818670
## Temperature.T.K.                                         0.319496158
## Generated.heat.Q.kJ.                                     0.110066552
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.003898025
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.152006994
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.012212893
## Oil.flow.Foil.L.hr.                                     -0.235745559
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.087066818
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.068881185
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.140986160
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.048459624
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.023849756
## Carbon.evolution.rate.CER.g.h.                           0.030886802
## Viscosity.Viscosity_offline.centPoise.                  -0.025725212
## X1.Raman.spec.recorded                                   0.057315094
## X2.PAT.control.PAT_ref.PAT.ref.                          0.057315094
## Batch.reference.Batch_ref.Batch.ref.                     0.057315094
## Batch.ID                                                -0.118874559
## Fault.flag                                              -0.116137514
##                                                                  PC9
## Time..h.                                                -0.022454892
## Aeration.rate.Fg.L.h.                                   -0.049684263
## Sugar.feed.rate.Fs.L.h.                                  0.397333505
## Acid.flow.rate.Fa.L.h.                                   0.109975818
## Base.flow.rate.Fb.L.h.                                  -0.318436441
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.079393983
## Heating.water.flow.rate.Fh.L.h.                         -0.195968338
## Water.for.injection.dilution.Fw.L.h.                    -0.027634043
## Air.head.pressure.pressure.bar.                          0.100806285
## Dumped.broth.flow.Fremoved.L.h.                         -0.067035589
## Substrate.concentration.S.g.L.                          -0.035382828
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.054456829
## Penicillin.concentration.P.g.L.                         -0.029040294
## Vessel.Volume.V.L.                                       0.001764422
## Vessel.Weight.Wt.Kg.                                    -0.002049049
## pH.pH.pH.                                               -0.249627906
## Temperature.T.K.                                         0.258779463
## Generated.heat.Q.kJ.                                     0.068089750
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.051650360
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.540012788
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.001596532
## Oil.flow.Foil.L.hr.                                     -0.065868571
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.019373827
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.188681803
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.141791423
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.008076985
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.006582625
## Carbon.evolution.rate.CER.g.h.                           0.024656572
## Viscosity.Viscosity_offline.centPoise.                   0.003235619
## X1.Raman.spec.recorded                                  -0.027634043
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.027634043
## Batch.reference.Batch_ref.Batch.ref.                    -0.027634043
## Batch.ID                                                -0.290003811
## Fault.flag                                              -0.291069478
##                                                                 PC10
## Time..h.                                                 0.007368023
## Aeration.rate.Fg.L.h.                                    0.078837523
## Sugar.feed.rate.Fs.L.h.                                 -0.353049804
## Acid.flow.rate.Fa.L.h.                                   0.320297359
## Base.flow.rate.Fb.L.h.                                   0.352521800
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.074682240
## Heating.water.flow.rate.Fh.L.h.                          0.078646598
## Water.for.injection.dilution.Fw.L.h.                     0.035819733
## Air.head.pressure.pressure.bar.                         -0.187557538
## Dumped.broth.flow.Fremoved.L.h.                         -0.236798010
## Substrate.concentration.S.g.L.                           0.025889658
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.224826585
## Penicillin.concentration.P.g.L.                          0.055556607
## Vessel.Volume.V.L.                                      -0.005739401
## Vessel.Weight.Wt.Kg.                                    -0.002262903
## pH.pH.pH.                                               -0.471055664
## Temperature.T.K.                                         0.009889009
## Generated.heat.Q.kJ.                                    -0.069392040
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.072981112
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.221537935
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.009895614
## Oil.flow.Foil.L.hr.                                     -0.422204062
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.015372219
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.076919578
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.013336505
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.022221679
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.017415320
## Carbon.evolution.rate.CER.g.h.                          -0.015750406
## Viscosity.Viscosity_offline.centPoise.                  -0.008272521
## X1.Raman.spec.recorded                                   0.035819733
## X2.PAT.control.PAT_ref.PAT.ref.                          0.035819733
## Batch.reference.Batch_ref.Batch.ref.                     0.035819733
## Batch.ID                                                 0.079845706
## Fault.flag                                               0.079690239
##                                                                PC11
## Time..h.                                                -0.06152017
## Aeration.rate.Fg.L.h.                                   -0.17921669
## Sugar.feed.rate.Fs.L.h.                                  0.16144713
## Acid.flow.rate.Fa.L.h.                                  -0.02587831
## Base.flow.rate.Fb.L.h.                                   0.13394244
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.04723808
## Heating.water.flow.rate.Fh.L.h.                         -0.17789397
## Water.for.injection.dilution.Fw.L.h.                    -0.02711510
## Air.head.pressure.pressure.bar.                         -0.09452868
## Dumped.broth.flow.Fremoved.L.h.                          0.04543940
## Substrate.concentration.S.g.L.                          -0.04462277
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.11007323
## Penicillin.concentration.P.g.L.                          0.01558042
## Vessel.Volume.V.L.                                      -0.20876611
## Vessel.Weight.Wt.Kg.                                    -0.17298829
## pH.pH.pH.                                                0.05484241
## Temperature.T.K.                                         0.20960731
## Generated.heat.Q.kJ.                                     0.02018092
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.05276491
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.41170499
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.01491438
## Oil.flow.Foil.L.hr.                                      0.25479056
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.16645118
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.13860344
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.07076252
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.10187712
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.04831666
## Carbon.evolution.rate.CER.g.h.                          -0.05520468
## Viscosity.Viscosity_offline.centPoise.                   0.05962940
## X1.Raman.spec.recorded                                  -0.02711510
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.02711510
## Batch.reference.Batch_ref.Batch.ref.                    -0.02711510
## Batch.ID                                                 0.46076210
## Fault.flag                                               0.46413929
##                                                                 PC12
## Time..h.                                                 0.032018798
## Aeration.rate.Fg.L.h.                                   -0.013148983
## Sugar.feed.rate.Fs.L.h.                                  0.166350279
## Acid.flow.rate.Fa.L.h.                                   0.232543850
## Base.flow.rate.Fb.L.h.                                   0.452277308
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.101367422
## Heating.water.flow.rate.Fh.L.h.                         -0.210731588
## Water.for.injection.dilution.Fw.L.h.                     0.014040660
## Air.head.pressure.pressure.bar.                          0.196495750
## Dumped.broth.flow.Fremoved.L.h.                         -0.194465805
## Substrate.concentration.S.g.L.                           0.022897068
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.489256495
## Penicillin.concentration.P.g.L.                         -0.004241974
## Vessel.Volume.V.L.                                       0.093123122
## Vessel.Weight.Wt.Kg.                                     0.078639443
## pH.pH.pH.                                               -0.231034684
## Temperature.T.K.                                         0.173769229
## Generated.heat.Q.kJ.                                     0.093457013
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.058837974
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.226218393
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.025689800
## Oil.flow.Foil.L.hr.                                      0.179708088
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.297025326
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.070250781
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.011594407
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.167332556
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.057586083
## Carbon.evolution.rate.CER.g.h.                           0.036624931
## Viscosity.Viscosity_offline.centPoise.                   0.100657196
## X1.Raman.spec.recorded                                   0.014040660
## X2.PAT.control.PAT_ref.PAT.ref.                          0.014040660
## Batch.reference.Batch_ref.Batch.ref.                     0.014040660
## Batch.ID                                                -0.069922426
## Fault.flag                                              -0.070409970
##                                                                 PC13
## Time..h.                                                -0.094320360
## Aeration.rate.Fg.L.h.                                    0.153493269
## Sugar.feed.rate.Fs.L.h.                                  0.058303833
## Acid.flow.rate.Fa.L.h.                                  -0.044994814
## Base.flow.rate.Fb.L.h.                                  -0.028205404
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.402237690
## Heating.water.flow.rate.Fh.L.h.                          0.357423112
## Water.for.injection.dilution.Fw.L.h.                    -0.106466855
## Air.head.pressure.pressure.bar.                          0.249617808
## Dumped.broth.flow.Fremoved.L.h.                          0.019872408
## Substrate.concentration.S.g.L.                          -0.144549835
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.215523392
## Penicillin.concentration.P.g.L.                         -0.083719700
## Vessel.Volume.V.L.                                      -0.172097383
## Vessel.Weight.Wt.Kg.                                    -0.149748475
## pH.pH.pH.                                                0.048129297
## Temperature.T.K.                                        -0.340572293
## Generated.heat.Q.kJ.                                     0.008313938
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.080257096
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.141562848
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.043271925
## Oil.flow.Foil.L.hr.                                     -0.224641530
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.391039065
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.089686563
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.053589581
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.220961773
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.082217074
## Carbon.evolution.rate.CER.g.h.                           0.027406660
## Viscosity.Viscosity_offline.centPoise.                   0.120886657
## X1.Raman.spec.recorded                                  -0.106466855
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.106466855
## Batch.reference.Batch_ref.Batch.ref.                    -0.106466855
## Batch.ID                                                 0.053829736
## Fault.flag                                               0.049709984
##                                                                 PC14
## Time..h.                                                -0.066331211
## Aeration.rate.Fg.L.h.                                    0.001282018
## Sugar.feed.rate.Fs.L.h.                                  0.136929824
## Acid.flow.rate.Fa.L.h.                                   0.084626677
## Base.flow.rate.Fb.L.h.                                   0.115263954
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.152867246
## Heating.water.flow.rate.Fh.L.h.                          0.081296062
## Water.for.injection.dilution.Fw.L.h.                    -0.065939900
## Air.head.pressure.pressure.bar.                          0.258950282
## Dumped.broth.flow.Fremoved.L.h.                         -0.089066067
## Substrate.concentration.S.g.L.                          -0.101656089
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.339636486
## Penicillin.concentration.P.g.L.                         -0.037987199
## Vessel.Volume.V.L.                                      -0.145619131
## Vessel.Weight.Wt.Kg.                                    -0.123332109
## pH.pH.pH.                                               -0.142204727
## Temperature.T.K.                                        -0.080386850
## Generated.heat.Q.kJ.                                     0.077260832
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.082017005
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.055716273
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.064464415
## Oil.flow.Foil.L.hr.                                      0.061523551
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.630649655
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.001820586
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.007899085
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.349969319
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.125173039
## Carbon.evolution.rate.CER.g.h.                           0.028734431
## Viscosity.Viscosity_offline.centPoise.                  -0.202042297
## X1.Raman.spec.recorded                                  -0.065939900
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.065939900
## Batch.reference.Batch_ref.Batch.ref.                    -0.065939900
## Batch.ID                                                 0.146012301
## Fault.flag                                               0.145515154
##                                                                 PC15
## Time..h.                                                 0.063365079
## Aeration.rate.Fg.L.h.                                   -0.137547519
## Sugar.feed.rate.Fs.L.h.                                 -0.189339469
## Acid.flow.rate.Fa.L.h.                                   0.071926728
## Base.flow.rate.Fb.L.h.                                  -0.018916448
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.238351618
## Heating.water.flow.rate.Fh.L.h.                          0.162766215
## Water.for.injection.dilution.Fw.L.h.                    -0.036180928
## Air.head.pressure.pressure.bar.                         -0.146866992
## Dumped.broth.flow.Fremoved.L.h.                          0.053153648
## Substrate.concentration.S.g.L.                           0.070782629
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.244682949
## Penicillin.concentration.P.g.L.                         -0.189671835
## Vessel.Volume.V.L.                                       0.517303247
## Vessel.Weight.Wt.Kg.                                     0.399551199
## pH.pH.pH.                                                0.041207076
## Temperature.T.K.                                        -0.101026775
## Generated.heat.Q.kJ.                                    -0.090488498
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.124995338
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.314243154
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.002976423
## Oil.flow.Foil.L.hr.                                      0.319453839
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.001789519
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.107014303
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.146381374
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.036405703
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.004467669
## Carbon.evolution.rate.CER.g.h.                          -0.110165036
## Viscosity.Viscosity_offline.centPoise.                   0.014714814
## X1.Raman.spec.recorded                                  -0.036180928
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.036180928
## Batch.reference.Batch_ref.Batch.ref.                    -0.036180928
## Batch.ID                                                 0.073426950
## Fault.flag                                               0.078438490
##                                                                  PC16
## Time..h.                                                 0.0184051792
## Aeration.rate.Fg.L.h.                                    0.1146565675
## Sugar.feed.rate.Fs.L.h.                                  0.0978933880
## Acid.flow.rate.Fa.L.h.                                   0.0806119141
## Base.flow.rate.Fb.L.h.                                   0.0865316507
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.2572843203
## Heating.water.flow.rate.Fh.L.h.                          0.1950785042
## Water.for.injection.dilution.Fw.L.h.                     0.0401843666
## Air.head.pressure.pressure.bar.                         -0.0811645556
## Dumped.broth.flow.Fremoved.L.h.                         -0.1280154456
## Substrate.concentration.S.g.L.                           0.0323404135
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.2829501577
## Penicillin.concentration.P.g.L.                          0.0645180010
## Vessel.Volume.V.L.                                      -0.0361698448
## Vessel.Weight.Wt.Kg.                                    -0.0213198098
## pH.pH.pH.                                               -0.1585321547
## Temperature.T.K.                                        -0.1511903401
## Generated.heat.Q.kJ.                                     0.0220838850
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0050521496
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.0753118399
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.0007399452
## Oil.flow.Foil.L.hr.                                      0.4910684103
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.0141044198
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.3388721722
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.4969766721
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.0014268662
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0127687718
## Carbon.evolution.rate.CER.g.h.                           0.0315662125
## Viscosity.Viscosity_offline.centPoise.                  -0.0132505434
## X1.Raman.spec.recorded                                   0.0401843666
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0401843666
## Batch.reference.Batch_ref.Batch.ref.                     0.0401843666
## Batch.ID                                                -0.2111153193
## Fault.flag                                              -0.1974276544
##                                                                  PC17
## Time..h.                                                -0.0009414251
## Aeration.rate.Fg.L.h.                                    0.5798467052
## Sugar.feed.rate.Fs.L.h.                                 -0.4800408919
## Acid.flow.rate.Fa.L.h.                                  -0.0462901930
## Base.flow.rate.Fb.L.h.                                  -0.0592740971
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.2092463886
## Heating.water.flow.rate.Fh.L.h.                         -0.1127037877
## Water.for.injection.dilution.Fw.L.h.                     0.0248346686
## Air.head.pressure.pressure.bar.                          0.1571253689
## Dumped.broth.flow.Fremoved.L.h.                          0.0133341035
## Substrate.concentration.S.g.L.                          -0.0230510442
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.1274992656
## Penicillin.concentration.P.g.L.                          0.0798749534
## Vessel.Volume.V.L.                                      -0.1671522727
## Vessel.Weight.Wt.Kg.                                    -0.1246311565
## pH.pH.pH.                                                0.0265994584
## Temperature.T.K.                                         0.0624276978
## Generated.heat.Q.kJ.                                     0.0004925214
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0012538999
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.2412093261
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.0087788538
## Oil.flow.Foil.L.hr.                                      0.3698733541
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.0119654475
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.2592379660
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.0381224364
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.0159359791
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.0160878906
## Carbon.evolution.rate.CER.g.h.                           0.0675714241
## Viscosity.Viscosity_offline.centPoise.                  -0.0049331471
## X1.Raman.spec.recorded                                   0.0248346686
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0248346686
## Batch.reference.Batch_ref.Batch.ref.                     0.0248346686
## Batch.ID                                                -0.0422045393
## Fault.flag                                              -0.0431843816
##                                                                  PC18
## Time..h.                                                -0.0769262121
## Aeration.rate.Fg.L.h.                                    0.4424318850
## Sugar.feed.rate.Fs.L.h.                                  0.2306228054
## Acid.flow.rate.Fa.L.h.                                   0.0333831982
## Base.flow.rate.Fb.L.h.                                   0.0001203153
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.1637239939
## Heating.water.flow.rate.Fh.L.h.                         -0.1186965925
## Water.for.injection.dilution.Fw.L.h.                    -0.1891721574
## Air.head.pressure.pressure.bar.                          0.0375830649
## Dumped.broth.flow.Fremoved.L.h.                         -0.0030281198
## Substrate.concentration.S.g.L.                          -0.1235240546
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.1633385131
## Penicillin.concentration.P.g.L.                         -0.3076843654
## Vessel.Volume.V.L.                                       0.2842796189
## Vessel.Weight.Wt.Kg.                                     0.1950569331
## pH.pH.pH.                                               -0.0096197758
## Temperature.T.K.                                         0.1062893814
## Generated.heat.Q.kJ.                                    -0.0252343567
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.1046938392
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.1084310417
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.0170732109
## Oil.flow.Foil.L.hr.                                     -0.1386169936
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.0255123424
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.1561640049
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.4293636849
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.0220125748
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0273899491
## Carbon.evolution.rate.CER.g.h.                          -0.0855927077
## Viscosity.Viscosity_offline.centPoise.                   0.0067024606
## X1.Raman.spec.recorded                                  -0.1891721574
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.1891721574
## Batch.reference.Batch_ref.Batch.ref.                    -0.1891721574
## Batch.ID                                                 0.1358061205
## Fault.flag                                               0.1114170518
##                                                                 PC19
## Time..h.                                                -0.064061981
## Aeration.rate.Fg.L.h.                                   -0.335177188
## Sugar.feed.rate.Fs.L.h.                                 -0.396774499
## Acid.flow.rate.Fa.L.h.                                   0.018041617
## Base.flow.rate.Fb.L.h.                                   0.013892162
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.076787044
## Heating.water.flow.rate.Fh.L.h.                         -0.085815869
## Water.for.injection.dilution.Fw.L.h.                    -0.127504826
## Air.head.pressure.pressure.bar.                          0.414314092
## Dumped.broth.flow.Fremoved.L.h.                          0.029158323
## Substrate.concentration.S.g.L.                          -0.160414292
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.280648806
## Penicillin.concentration.P.g.L.                         -0.126454396
## Vessel.Volume.V.L.                                       0.140256536
## Vessel.Weight.Wt.Kg.                                     0.106128889
## pH.pH.pH.                                               -0.010977858
## Temperature.T.K.                                         0.030555712
## Generated.heat.Q.kJ.                                     0.219256045
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.453960480
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.045464978
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.020030104
## Oil.flow.Foil.L.hr.                                      0.028252851
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.032605591
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.117608033
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.078463196
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.027917646
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.056002735
## Carbon.evolution.rate.CER.g.h.                           0.196229450
## Viscosity.Viscosity_offline.centPoise.                   0.023571540
## X1.Raman.spec.recorded                                  -0.127504826
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.127504826
## Batch.reference.Batch_ref.Batch.ref.                    -0.127504826
## Batch.ID                                                -0.002469697
## Fault.flag                                              -0.029594081
##                                                                 PC20
## Time..h.                                                -0.058065110
## Aeration.rate.Fg.L.h.                                    0.001532730
## Sugar.feed.rate.Fs.L.h.                                 -0.033877547
## Acid.flow.rate.Fa.L.h.                                   0.008689025
## Base.flow.rate.Fb.L.h.                                   0.004211067
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.005777409
## Heating.water.flow.rate.Fh.L.h.                          0.003254063
## Water.for.injection.dilution.Fw.L.h.                    -0.016299917
## Air.head.pressure.pressure.bar.                         -0.038483814
## Dumped.broth.flow.Fremoved.L.h.                          0.006655604
## Substrate.concentration.S.g.L.                          -0.044893258
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.004042720
## Penicillin.concentration.P.g.L.                          0.052017022
## Vessel.Volume.V.L.                                       0.028371664
## Vessel.Weight.Wt.Kg.                                     0.022961486
## pH.pH.pH.                                               -0.010729526
## Temperature.T.K.                                         0.023051873
## Generated.heat.Q.kJ.                                    -0.088397475
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.116191137
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.012446484
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.328259255
## Oil.flow.Foil.L.hr.                                     -0.001346367
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.049614265
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.024032327
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.024644259
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.466348552
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.790877509
## Carbon.evolution.rate.CER.g.h.                           0.085525674
## Viscosity.Viscosity_offline.centPoise.                  -0.049217644
## X1.Raman.spec.recorded                                  -0.016299917
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.016299917
## Batch.reference.Batch_ref.Batch.ref.                    -0.016299917
## Batch.ID                                                 0.019117420
## Fault.flag                                               0.009716809
##                                                                  PC21
## Time..h.                                                -1.121703e-01
## Aeration.rate.Fg.L.h.                                   -1.758874e-01
## Sugar.feed.rate.Fs.L.h.                                 -2.069655e-03
## Acid.flow.rate.Fa.L.h.                                  -8.447166e-05
## Base.flow.rate.Fb.L.h.                                  -9.115224e-05
## Heating.cooling.water.flow.rate.Fc.L.h.                  1.114930e-02
## Heating.water.flow.rate.Fh.L.h.                          1.773871e-03
## Water.for.injection.dilution.Fw.L.h.                     3.221559e-02
## Air.head.pressure.pressure.bar.                         -2.867438e-02
## Dumped.broth.flow.Fremoved.L.h.                          2.522958e-02
## Substrate.concentration.S.g.L.                          -8.089627e-02
## Dissolved.oxygen.concentration.DO2.mg.L.                 5.834586e-02
## Penicillin.concentration.P.g.L.                          1.919260e-01
## Vessel.Volume.V.L.                                       5.478297e-02
## Vessel.Weight.Wt.Kg.                                     3.849328e-02
## pH.pH.pH.                                                4.278644e-03
## Temperature.T.K.                                         1.850084e-02
## Generated.heat.Q.kJ.                                    -6.754617e-02
## carbon.dioxide.percent.in.off.gas.CO2outgas...           1.768496e-02
## PAA.flow.Fpaa.PAA.flow..L.h..                           -2.425657e-02
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -2.804814e-01
## Oil.flow.Foil.L.hr.                                      1.741453e-02
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  1.542981e-01
## Oxygen.Uptake.Rate.OUR..g.min...1...                     3.165397e-01
## Oxygen.in.percent.in.off.gas.O2.O2......                 2.506273e-01
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  4.751024e-01
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      2.389011e-01
## Carbon.evolution.rate.CER.g.h.                           8.092608e-02
## Viscosity.Viscosity_offline.centPoise.                  -5.808609e-01
## X1.Raman.spec.recorded                                   3.221559e-02
## X2.PAT.control.PAT_ref.PAT.ref.                          3.221559e-02
## Batch.reference.Batch_ref.Batch.ref.                     3.221559e-02
## Batch.ID                                                -8.836214e-03
## Fault.flag                                               3.214699e-02
##                                                                  PC22
## Time..h.                                                -0.2133954733
## Aeration.rate.Fg.L.h.                                   -0.2285876932
## Sugar.feed.rate.Fs.L.h.                                  0.0056679460
## Acid.flow.rate.Fa.L.h.                                  -0.0059378756
## Base.flow.rate.Fb.L.h.                                  -0.0002423424
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.0098614459
## Heating.water.flow.rate.Fh.L.h.                          0.0069077212
## Water.for.injection.dilution.Fw.L.h.                     0.0490201024
## Air.head.pressure.pressure.bar.                         -0.1585252142
## Dumped.broth.flow.Fremoved.L.h.                          0.0391450339
## Substrate.concentration.S.g.L.                          -0.1551100249
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.1165830831
## Penicillin.concentration.P.g.L.                          0.3616488642
## Vessel.Volume.V.L.                                       0.0337915493
## Vessel.Weight.Wt.Kg.                                     0.0215969732
## pH.pH.pH.                                                0.0031926911
## Temperature.T.K.                                         0.0115981179
## Generated.heat.Q.kJ.                                    -0.0654634493
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0943491538
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.0381357137
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.1468840956
## Oil.flow.Foil.L.hr.                                      0.0312430999
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.1015997370
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.4845546136
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.3729060397
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.3197153345
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0870976421
## Carbon.evolution.rate.CER.g.h.                           0.1881576951
## Viscosity.Viscosity_offline.centPoise.                   0.3586798287
## X1.Raman.spec.recorded                                   0.0490201024
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0490201024
## Batch.reference.Batch_ref.Batch.ref.                     0.0490201024
## Batch.ID                                                 0.0032561035
## Fault.flag                                               0.0171251856
##                                                                 PC23
## Time..h.                                                 0.208243312
## Aeration.rate.Fg.L.h.                                   -0.250152247
## Sugar.feed.rate.Fs.L.h.                                 -0.092749004
## Acid.flow.rate.Fa.L.h.                                  -0.011063729
## Base.flow.rate.Fb.L.h.                                   0.013004355
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.032383617
## Heating.water.flow.rate.Fh.L.h.                         -0.018774474
## Water.for.injection.dilution.Fw.L.h.                     0.066427881
## Air.head.pressure.pressure.bar.                          0.265682697
## Dumped.broth.flow.Fremoved.L.h.                         -0.028746209
## Substrate.concentration.S.g.L.                           0.177299283
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.070208832
## Penicillin.concentration.P.g.L.                         -0.158479420
## Vessel.Volume.V.L.                                      -0.098038119
## Vessel.Weight.Wt.Kg.                                    -0.077444682
## pH.pH.pH.                                               -0.006685680
## Temperature.T.K.                                        -0.123467194
## Generated.heat.Q.kJ.                                     0.494759391
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.408438594
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.008978641
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.077521453
## Oil.flow.Foil.L.hr.                                      0.009542347
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.012033325
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.314550212
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.215844211
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.064955109
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.160987493
## Carbon.evolution.rate.CER.g.h.                          -0.325977733
## Viscosity.Viscosity_offline.centPoise.                   0.029967834
## X1.Raman.spec.recorded                                   0.066427881
## X2.PAT.control.PAT_ref.PAT.ref.                          0.066427881
## Batch.reference.Batch_ref.Batch.ref.                     0.066427881
## Batch.ID                                                -0.039373269
## Fault.flag                                               0.003109683
##                                                                 PC24
## Time..h.                                                 0.059939764
## Aeration.rate.Fg.L.h.                                   -0.119488605
## Sugar.feed.rate.Fs.L.h.                                 -0.012533450
## Acid.flow.rate.Fa.L.h.                                  -0.001594851
## Base.flow.rate.Fb.L.h.                                  -0.006441692
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.036318771
## Heating.water.flow.rate.Fh.L.h.                          0.041747411
## Water.for.injection.dilution.Fw.L.h.                     0.077452183
## Air.head.pressure.pressure.bar.                          0.584983441
## Dumped.broth.flow.Fremoved.L.h.                         -0.008751749
## Substrate.concentration.S.g.L.                           0.105249651
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.113185519
## Penicillin.concentration.P.g.L.                          0.039507229
## Vessel.Volume.V.L.                                       0.013691104
## Vessel.Weight.Wt.Kg.                                     0.014062644
## pH.pH.pH.                                               -0.003061390
## Temperature.T.K.                                         0.150373359
## Generated.heat.Q.kJ.                                    -0.706223207
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.196553049
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.005765153
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.022294453
## Oil.flow.Foil.L.hr.                                      0.000734295
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.013486538
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.004411432
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.087417459
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.040218901
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.018044371
## Carbon.evolution.rate.CER.g.h.                          -0.101766751
## Viscosity.Viscosity_offline.centPoise.                   0.048338691
## X1.Raman.spec.recorded                                   0.077452183
## X2.PAT.control.PAT_ref.PAT.ref.                          0.077452183
## Batch.reference.Batch_ref.Batch.ref.                     0.077452183
## Batch.ID                                                 0.058001656
## Fault.flag                                              -0.019348019
##                                                                 PC25
## Time..h.                                                 0.436409041
## Aeration.rate.Fg.L.h.                                   -0.078803225
## Sugar.feed.rate.Fs.L.h.                                 -0.002364755
## Acid.flow.rate.Fa.L.h.                                  -0.002494114
## Base.flow.rate.Fb.L.h.                                  -0.005551966
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.006544252
## Heating.water.flow.rate.Fh.L.h.                          0.007183061
## Water.for.injection.dilution.Fw.L.h.                     0.009751467
## Air.head.pressure.pressure.bar.                         -0.215480958
## Dumped.broth.flow.Fremoved.L.h.                         -0.015972526
## Substrate.concentration.S.g.L.                           0.337523230
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.093139358
## Penicillin.concentration.P.g.L.                         -0.475968707
## Vessel.Volume.V.L.                                      -0.206178884
## Vessel.Weight.Wt.Kg.                                    -0.119432655
## pH.pH.pH.                                               -0.006491864
## Temperature.T.K.                                         0.057716613
## Generated.heat.Q.kJ.                                    -0.224537504
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.437484672
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.009759106
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.001137262
## Oil.flow.Foil.L.hr.                                      0.011354706
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.004196004
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.231717622
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.196556763
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.004296299
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.002711113
## Carbon.evolution.rate.CER.g.h.                           0.101822172
## Viscosity.Viscosity_offline.centPoise.                  -0.001402599
## X1.Raman.spec.recorded                                   0.009751467
## X2.PAT.control.PAT_ref.PAT.ref.                          0.009751467
## Batch.reference.Batch_ref.Batch.ref.                     0.009751467
## Batch.ID                                                -0.022846691
## Fault.flag                                               0.039295921
##                                                                  PC26
## Time..h.                                                 0.0163475520
## Aeration.rate.Fg.L.h.                                   -0.0135959358
## Sugar.feed.rate.Fs.L.h.                                  0.0019256005
## Acid.flow.rate.Fa.L.h.                                  -0.0018061256
## Base.flow.rate.Fb.L.h.                                   0.0024028478
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.0051744514
## Heating.water.flow.rate.Fh.L.h.                          0.0023962589
## Water.for.injection.dilution.Fw.L.h.                     0.0061026013
## Air.head.pressure.pressure.bar.                         -0.0466665552
## Dumped.broth.flow.Fremoved.L.h.                         -0.0015968624
## Substrate.concentration.S.g.L.                           0.0212934496
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.0160340889
## Penicillin.concentration.P.g.L.                         -0.0130292716
## Vessel.Volume.V.L.                                      -0.0166311821
## Vessel.Weight.Wt.Kg.                                    -0.0118725001
## pH.pH.pH.                                               -0.0001319993
## Temperature.T.K.                                        -0.0110039234
## Generated.heat.Q.kJ.                                     0.0384582203
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0089521956
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.0015448749
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.0076227945
## Oil.flow.Foil.L.hr.                                      0.0099876928
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.0048210714
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.0298617221
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.0170079209
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.0118587347
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.0067320848
## Carbon.evolution.rate.CER.g.h.                           0.0050325625
## Viscosity.Viscosity_offline.centPoise.                  -0.0157794000
## X1.Raman.spec.recorded                                   0.0061026013
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0061026013
## Batch.reference.Batch_ref.Batch.ref.                     0.0061026013
## Batch.ID                                                 0.7009285919
## Fault.flag                                              -0.7078627166
##                                                                  PC27
## Time..h.                                                 3.824358e-01
## Aeration.rate.Fg.L.h.                                   -2.144494e-02
## Sugar.feed.rate.Fs.L.h.                                  8.181761e-03
## Acid.flow.rate.Fa.L.h.                                   3.850820e-04
## Base.flow.rate.Fb.L.h.                                  -2.032307e-03
## Heating.cooling.water.flow.rate.Fc.L.h.                 -4.750016e-04
## Heating.water.flow.rate.Fh.L.h.                          4.749223e-05
## Water.for.injection.dilution.Fw.L.h.                     1.761230e-01
## Air.head.pressure.pressure.bar.                         -3.459291e-02
## Dumped.broth.flow.Fremoved.L.h.                         -5.273818e-04
## Substrate.concentration.S.g.L.                          -7.816838e-01
## Dissolved.oxygen.concentration.DO2.mg.L.                 5.685468e-04
## Penicillin.concentration.P.g.L.                         -2.588258e-01
## Vessel.Volume.V.L.                                       2.466527e-02
## Vessel.Weight.Wt.Kg.                                    -3.034104e-02
## pH.pH.pH.                                               -1.735305e-04
## Temperature.T.K.                                         8.629823e-03
## Generated.heat.Q.kJ.                                    -3.206117e-02
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -1.344806e-01
## PAA.flow.Fpaa.PAA.flow..L.h..                           -3.283869e-03
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    3.728299e-03
## Oil.flow.Foil.L.hr.                                      4.956661e-03
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -1.403133e-03
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -2.111932e-02
## Oxygen.in.percent.in.off.gas.O2.O2......                -9.939939e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  3.047424e-03
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -7.493784e-03
## Carbon.evolution.rate.CER.g.h.                           1.688498e-01
## Viscosity.Viscosity_offline.centPoise.                   2.164928e-03
## X1.Raman.spec.recorded                                   1.761230e-01
## X2.PAT.control.PAT_ref.PAT.ref.                          1.761230e-01
## Batch.reference.Batch_ref.Batch.ref.                     1.761230e-01
## Batch.ID                                                 4.883384e-03
## Fault.flag                                               7.663584e-05
##                                                                  PC28
## Time..h.                                                 2.691022e-01
## Aeration.rate.Fg.L.h.                                    5.700884e-02
## Sugar.feed.rate.Fs.L.h.                                  9.354123e-03
## Acid.flow.rate.Fa.L.h.                                  -4.440018e-05
## Base.flow.rate.Fb.L.h.                                  -1.691743e-04
## Heating.cooling.water.flow.rate.Fc.L.h.                  6.437068e-04
## Heating.water.flow.rate.Fh.L.h.                          8.952013e-04
## Water.for.injection.dilution.Fw.L.h.                    -2.189527e-02
## Air.head.pressure.pressure.bar.                         -2.008607e-02
## Dumped.broth.flow.Fremoved.L.h.                         -1.008390e-03
## Substrate.concentration.S.g.L.                          -2.330149e-01
## Dissolved.oxygen.concentration.DO2.mg.L.                 8.219678e-03
## Penicillin.concentration.P.g.L.                          3.210617e-01
## Vessel.Volume.V.L.                                       1.855518e-02
## Vessel.Weight.Wt.Kg.                                     4.831416e-02
## pH.pH.pH.                                               -1.037851e-03
## Temperature.T.K.                                         8.279291e-03
## Generated.heat.Q.kJ.                                    -3.313066e-02
## carbon.dioxide.percent.in.off.gas.CO2outgas...           4.231488e-01
## PAA.flow.Fpaa.PAA.flow..L.h..                            2.777682e-03
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -5.412042e-04
## Oil.flow.Foil.L.hr.                                     -1.062298e-03
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  4.383784e-04
## Oxygen.Uptake.Rate.OUR..g.min...1...                     2.013715e-02
## Oxygen.in.percent.in.off.gas.O2.O2......                 2.074701e-02
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -1.411651e-03
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      6.170625e-04
## Carbon.evolution.rate.CER.g.h.                          -7.620279e-01
## Viscosity.Viscosity_offline.centPoise.                   8.691441e-04
## X1.Raman.spec.recorded                                  -2.189527e-02
## X2.PAT.control.PAT_ref.PAT.ref.                         -2.189527e-02
## Batch.reference.Batch_ref.Batch.ref.                    -2.189527e-02
## Batch.ID                                                 3.213801e-03
## Fault.flag                                              -5.756874e-03
##                                                                  PC29
## Time..h.                                                 6.120532e-01
## Aeration.rate.Fg.L.h.                                   -4.064618e-02
## Sugar.feed.rate.Fs.L.h.                                  1.577747e-03
## Acid.flow.rate.Fa.L.h.                                  -1.214094e-04
## Base.flow.rate.Fb.L.h.                                   2.776379e-04
## Heating.cooling.water.flow.rate.Fc.L.h.                  1.301870e-03
## Heating.water.flow.rate.Fh.L.h.                          9.975399e-04
## Water.for.injection.dilution.Fw.L.h.                    -2.672830e-01
## Air.head.pressure.pressure.bar.                         -1.025727e-03
## Dumped.broth.flow.Fremoved.L.h.                          2.712013e-04
## Substrate.concentration.S.g.L.                           1.754361e-02
## Dissolved.oxygen.concentration.DO2.mg.L.                 1.680678e-04
## Penicillin.concentration.P.g.L.                          4.152638e-01
## Vessel.Volume.V.L.                                      -1.035103e-01
## Vessel.Weight.Wt.Kg.                                     1.246625e-01
## pH.pH.pH.                                                1.473822e-04
## Temperature.T.K.                                         1.527968e-03
## Generated.heat.Q.kJ.                                    -8.467692e-03
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -2.374002e-01
## PAA.flow.Fpaa.PAA.flow..L.h..                           -5.663866e-05
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -1.800678e-03
## Oil.flow.Foil.L.hr.                                     -1.538917e-03
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  1.018162e-03
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -5.683822e-03
## Oxygen.in.percent.in.off.gas.O2.O2......                -3.969260e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  9.530681e-04
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      5.998780e-04
## Carbon.evolution.rate.CER.g.h.                           2.871709e-01
## Viscosity.Viscosity_offline.centPoise.                  -8.413957e-04
## X1.Raman.spec.recorded                                  -2.672830e-01
## X2.PAT.control.PAT_ref.PAT.ref.                         -2.672830e-01
## Batch.reference.Batch_ref.Batch.ref.                    -2.672830e-01
## Batch.ID                                                -9.883312e-05
## Fault.flag                                              -2.819672e-03
##                                                                  PC30
## Time..h.                                                 1.230256e-01
## Aeration.rate.Fg.L.h.                                    7.877497e-04
## Sugar.feed.rate.Fs.L.h.                                 -6.628802e-05
## Acid.flow.rate.Fa.L.h.                                  -2.229730e-06
## Base.flow.rate.Fb.L.h.                                   1.545568e-05
## Heating.cooling.water.flow.rate.Fc.L.h.                  3.186020e-05
## Heating.water.flow.rate.Fh.L.h.                          2.080165e-05
## Water.for.injection.dilution.Fw.L.h.                    -3.410205e-02
## Air.head.pressure.pressure.bar.                          5.688225e-04
## Dumped.broth.flow.Fremoved.L.h.                          6.714456e-05
## Substrate.concentration.S.g.L.                           5.618848e-02
## Dissolved.oxygen.concentration.DO2.mg.L.                -2.800477e-04
## Penicillin.concentration.P.g.L.                          8.938592e-02
## Vessel.Volume.V.L.                                       6.068336e-01
## Vessel.Weight.Wt.Kg.                                    -7.741786e-01
## pH.pH.pH.                                               -2.906766e-05
## Temperature.T.K.                                         2.697188e-05
## Generated.heat.Q.kJ.                                    -1.591079e-04
## carbon.dioxide.percent.in.off.gas.CO2outgas...           2.143558e-03
## PAA.flow.Fpaa.PAA.flow..L.h..                           -7.864233e-05
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -1.201987e-02
## Oil.flow.Foil.L.hr.                                     -8.170999e-05
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  4.732881e-03
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -1.054041e-03
## Oxygen.in.percent.in.off.gas.O2.O2......                -1.002596e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  2.992592e-03
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -3.543366e-03
## Carbon.evolution.rate.CER.g.h.                           3.472656e-02
## Viscosity.Viscosity_offline.centPoise.                   8.008736e-03
## X1.Raman.spec.recorded                                  -3.410205e-02
## X2.PAT.control.PAT_ref.PAT.ref.                         -3.410205e-02
## Batch.reference.Batch_ref.Batch.ref.                    -3.410205e-02
## Batch.ID                                                -3.689382e-04
## Fault.flag                                               2.077603e-04
##                                                                  PC31
## Time..h.                                                 2.934142e-03
## Aeration.rate.Fg.L.h.                                   -6.526325e-06
## Sugar.feed.rate.Fs.L.h.                                  9.905780e-06
## Acid.flow.rate.Fa.L.h.                                  -5.206202e-07
## Base.flow.rate.Fb.L.h.                                  -7.790127e-07
## Heating.cooling.water.flow.rate.Fc.L.h.                  4.514214e-06
## Heating.water.flow.rate.Fh.L.h.                          9.917268e-06
## Water.for.injection.dilution.Fw.L.h.                    -8.834319e-04
## Air.head.pressure.pressure.bar.                          3.081947e-05
## Dumped.broth.flow.Fremoved.L.h.                         -1.386713e-06
## Substrate.concentration.S.g.L.                           7.550015e-04
## Dissolved.oxygen.concentration.DO2.mg.L.                -4.634964e-06
## Penicillin.concentration.P.g.L.                          2.122122e-03
## Vessel.Volume.V.L.                                       9.518125e-03
## Vessel.Weight.Wt.Kg.                                    -1.211968e-02
## pH.pH.pH.                                               -1.713164e-06
## Temperature.T.K.                                         1.722041e-05
## Generated.heat.Q.kJ.                                    -9.863655e-05
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -4.164241e-05
## PAA.flow.Fpaa.PAA.flow..L.h..                           -7.435965e-07
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    7.576183e-01
## Oil.flow.Foil.L.hr.                                     -3.697291e-06
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -2.979014e-01
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -1.630360e-05
## Oxygen.in.percent.in.off.gas.O2.O2......                -6.535956e-06
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -1.838119e-01
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      2.188254e-01
## Carbon.evolution.rate.CER.g.h.                           4.753065e-04
## Viscosity.Viscosity_offline.centPoise.                  -5.053152e-01
## X1.Raman.spec.recorded                                  -8.834319e-04
## X2.PAT.control.PAT_ref.PAT.ref.                         -8.834319e-04
## Batch.reference.Batch_ref.Batch.ref.                    -8.834319e-04
## Batch.ID                                                -3.937741e-05
## Fault.flag                                               3.452151e-05
##                                                                  PC32
## Time..h.                                                 0.000000e+00
## Aeration.rate.Fg.L.h.                                   -1.498688e-16
## Sugar.feed.rate.Fs.L.h.                                 -3.706439e-16
## Acid.flow.rate.Fa.L.h.                                  -7.394726e-17
## Base.flow.rate.Fb.L.h.                                  -2.489914e-16
## Heating.cooling.water.flow.rate.Fc.L.h.                 -3.518133e-17
## Heating.water.flow.rate.Fh.L.h.                         -2.343877e-16
## Water.for.injection.dilution.Fw.L.h.                     8.367269e-01
## Air.head.pressure.pressure.bar.                          1.739256e-15
## Dumped.broth.flow.Fremoved.L.h.                         -9.048135e-17
## Substrate.concentration.S.g.L.                          -5.571068e-15
## Dissolved.oxygen.concentration.DO2.mg.L.                -6.259118e-16
## Penicillin.concentration.P.g.L.                          7.821862e-16
## Vessel.Volume.V.L.                                      -3.608621e-14
## Vessel.Weight.Wt.Kg.                                     4.708056e-14
## pH.pH.pH.                                                6.190816e-17
## Temperature.T.K.                                        -1.114858e-16
## Generated.heat.Q.kJ.                                    -1.605760e-16
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -4.699472e-16
## PAA.flow.Fpaa.PAA.flow..L.h..                            1.459155e-16
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    3.770295e-12
## Oil.flow.Foil.L.hr.                                      1.050414e-16
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -1.482530e-12
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -5.100206e-16
## Oxygen.in.percent.in.off.gas.O2.O2......                -3.269461e-16
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -9.148009e-13
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      1.089148e-12
## Carbon.evolution.rate.CER.g.h.                          -6.431984e-15
## Viscosity.Viscosity_offline.centPoise.                  -2.514762e-12
## X1.Raman.spec.recorded                                  -3.846765e-01
## X2.PAT.control.PAT_ref.PAT.ref.                         -3.837230e-01
## Batch.reference.Batch_ref.Batch.ref.                    -6.832739e-02
## Batch.ID                                                -1.038671e-16
## Fault.flag                                               3.278719e-17
##                                                                  PC33
## Time..h.                                                 0.000000e+00
## Aeration.rate.Fg.L.h.                                   -1.204279e-15
## Sugar.feed.rate.Fs.L.h.                                  1.973128e-16
## Acid.flow.rate.Fa.L.h.                                  -7.312851e-17
## Base.flow.rate.Fb.L.h.                                   1.797150e-21
## Heating.cooling.water.flow.rate.Fc.L.h.                  1.159654e-16
## Heating.water.flow.rate.Fh.L.h.                          1.119529e-16
## Water.for.injection.dilution.Fw.L.h.                    -2.233557e-01
## Air.head.pressure.pressure.bar.                         -7.618639e-16
## Dumped.broth.flow.Fremoved.L.h.                          9.378234e-17
## Substrate.concentration.S.g.L.                           4.408421e-15
## Dissolved.oxygen.concentration.DO2.mg.L.                 3.928159e-16
## Penicillin.concentration.P.g.L.                         -1.915343e-15
## Vessel.Volume.V.L.                                      -1.722016e-15
## Vessel.Weight.Wt.Kg.                                     6.678049e-16
## pH.pH.pH.                                                2.766393e-17
## Temperature.T.K.                                        -1.338515e-17
## Generated.heat.Q.kJ.                                     2.510971e-16
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -1.043119e-14
## PAA.flow.Fpaa.PAA.flow..L.h..                           -2.765311e-17
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -7.424537e-15
## Oil.flow.Foil.L.hr.                                     -1.592945e-16
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  2.941881e-15
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -3.931970e-16
## Oxygen.in.percent.in.off.gas.O2.O2......                -7.760695e-16
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  1.854898e-15
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -2.157885e-15
## Carbon.evolution.rate.CER.g.h.                           1.879174e-14
## Viscosity.Viscosity_offline.centPoise.                   4.901706e-15
## X1.Raman.spec.recorded                                  -3.201159e-01
## X2.PAT.control.PAT_ref.PAT.ref.                         -3.198542e-01
## Batch.reference.Batch_ref.Batch.ref.                     8.633258e-01
## Batch.ID                                                -2.542415e-17
## Fault.flag                                               8.601645e-17
##                                                                  PC34
## Time..h.                                                 0.000000e+00
## Aeration.rate.Fg.L.h.                                    2.571851e-17
## Sugar.feed.rate.Fs.L.h.                                  5.946915e-18
## Acid.flow.rate.Fa.L.h.                                  -5.173532e-18
## Base.flow.rate.Fb.L.h.                                  -3.058193e-18
## Heating.cooling.water.flow.rate.Fc.L.h.                 -7.152643e-18
## Heating.water.flow.rate.Fh.L.h.                          4.137743e-18
## Water.for.injection.dilution.Fw.L.h.                     5.227952e-04
## Air.head.pressure.pressure.bar.                         -2.431983e-17
## Dumped.broth.flow.Fremoved.L.h.                         -2.237613e-18
## Substrate.concentration.S.g.L.                           2.519063e-17
## Dissolved.oxygen.concentration.DO2.mg.L.                 6.201101e-18
## Penicillin.concentration.P.g.L.                          4.410411e-17
## Vessel.Volume.V.L.                                      -1.490021e-17
## Vessel.Weight.Wt.Kg.                                     2.172133e-17
## pH.pH.pH.                                               -3.075932e-18
## Temperature.T.K.                                        -1.400779e-17
## Generated.heat.Q.kJ.                                     4.947761e-17
## carbon.dioxide.percent.in.off.gas.CO2outgas...           3.841938e-18
## PAA.flow.Fpaa.PAA.flow..L.h..                           -8.899245e-19
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    5.209848e-17
## Oil.flow.Foil.L.hr.                                     -1.294054e-18
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -7.213155e-18
## Oxygen.Uptake.Rate.OUR..g.min...1...                     9.229549e-18
## Oxygen.in.percent.in.off.gas.O2.O2......                 4.620471e-18
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -2.450539e-17
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      2.887713e-19
## Carbon.evolution.rate.CER.g.h.                           1.251348e-17
## Viscosity.Viscosity_offline.centPoise.                  -1.908258e-17
## X1.Raman.spec.recorded                                   7.067884e-01
## X2.PAT.control.PAT_ref.PAT.ref.                         -7.074248e-01
## Batch.reference.Batch_ref.Batch.ref.                     1.136656e-04
## Batch.ID                                                 3.217869e-18
## Fault.flag                                               7.014259e-18
pca <- prcomp(Penicillin_scaled, scale = T)
pca$sdev
##  [1] 4.358686e+00 2.205296e+00 2.100134e+00 1.418142e+00 1.166698e+00
##  [6] 8.085847e-01 6.500733e-01 5.784470e-01 5.028894e-01 4.349995e-01
## [11] 3.567104e-01 3.350405e-01 2.712734e-01 2.447796e-01 2.091135e-01
## [16] 1.934269e-01 1.381817e-01 1.366587e-01 6.953700e-02 4.144815e-02
## [21] 3.368249e-02 3.240153e-02 2.995979e-02 2.311646e-02 1.546378e-02
## [26] 1.363907e-02 3.017046e-03 1.505562e-03 7.818226e-04 5.366227e-05
## [31] 1.367838e-05 4.210701e-16 4.210701e-16 4.210701e-16
pca$sdev^2
##  [1] 1.899815e+01 4.863329e+00 4.410565e+00 2.011128e+00 1.361185e+00
##  [6] 6.538093e-01 4.225952e-01 3.346009e-01 2.528977e-01 1.892245e-01
## [11] 1.272423e-01 1.122522e-01 7.358924e-02 5.991706e-02 4.372847e-02
## [16] 3.741396e-02 1.909417e-02 1.867559e-02 4.835394e-03 1.717949e-03
## [21] 1.134510e-03 1.049859e-03 8.975892e-04 5.343709e-04 2.391284e-04
## [26] 1.860244e-04 9.102565e-06 2.266718e-06 6.112465e-07 2.879639e-09
## [31] 1.870981e-10 1.773000e-31 1.773000e-31 1.773000e-31
pca$rotation
##                                                                 PC1
## Time..h.                                                 0.22770584
## Aeration.rate.Fg.L.h.                                    0.21625494
## Sugar.feed.rate.Fs.L.h.                                  0.18791620
## Acid.flow.rate.Fa.L.h.                                   0.04524415
## Base.flow.rate.Fb.L.h.                                  -0.16832698
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.13267186
## Heating.water.flow.rate.Fh.L.h.                          0.10860797
## Water.for.injection.dilution.Fw.L.h.                     0.22839846
## Air.head.pressure.pressure.bar.                          0.22084594
## Dumped.broth.flow.Fremoved.L.h.                         -0.05818216
## Substrate.concentration.S.g.L.                           0.22820718
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.01699940
## Penicillin.concentration.P.g.L.                          0.22811631
## Vessel.Volume.V.L.                                       0.22492886
## Vessel.Weight.Wt.Kg.                                     0.22609929
## pH.pH.pH.                                                0.04783488
## Temperature.T.K.                                        -0.12103745
## Generated.heat.Q.kJ.                                     0.22089665
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.21999985
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.16183831
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.03279132
## Oil.flow.Foil.L.hr.                                     -0.17494631
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.02621682
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.10089045
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.10026949
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.03656895
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.03441640
## Carbon.evolution.rate.CER.g.h.                           0.22463193
## Viscosity.Viscosity_offline.centPoise.                   0.03531000
## X1.Raman.spec.recorded                                   0.22839846
## X2.PAT.control.PAT_ref.PAT.ref.                          0.22839846
## Batch.reference.Batch_ref.Batch.ref.                     0.22839846
## Batch.ID                                                 0.21474923
## Fault.flag                                               0.21466435
##                                                                  PC2
## Time..h.                                                -0.013569704
## Aeration.rate.Fg.L.h.                                   -0.017540578
## Sugar.feed.rate.Fs.L.h.                                 -0.021410561
## Acid.flow.rate.Fa.L.h.                                  -0.043978179
## Base.flow.rate.Fb.L.h.                                   0.006316711
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.003390360
## Heating.water.flow.rate.Fh.L.h.                          0.009200547
## Water.for.injection.dilution.Fw.L.h.                    -0.016036621
## Air.head.pressure.pressure.bar.                         -0.019063856
## Dumped.broth.flow.Fremoved.L.h.                          0.049567917
## Substrate.concentration.S.g.L.                          -0.013083921
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.015731993
## Penicillin.concentration.P.g.L.                         -0.020242944
## Vessel.Volume.V.L.                                      -0.005733205
## Vessel.Weight.Wt.Kg.                                    -0.008072996
## pH.pH.pH.                                               -0.058057137
## Temperature.T.K.                                         0.014709574
## Generated.heat.Q.kJ.                                    -0.015241275
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.020927617
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.004138840
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.447758597
## Oil.flow.Foil.L.hr.                                      0.002757476
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.437072868
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.006296079
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.005729786
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.443015637
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.446674806
## Carbon.evolution.rate.CER.g.h.                          -0.019762235
## Viscosity.Viscosity_offline.centPoise.                   0.445935164
## X1.Raman.spec.recorded                                  -0.016036621
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.016036621
## Batch.reference.Batch_ref.Batch.ref.                    -0.016036621
## Batch.ID                                                -0.025455344
## Fault.flag                                              -0.025518573
##                                                                  PC3
## Time..h.                                                 0.041384471
## Aeration.rate.Fg.L.h.                                    0.136324640
## Sugar.feed.rate.Fs.L.h.                                  0.223741196
## Acid.flow.rate.Fa.L.h.                                  -0.040044762
## Base.flow.rate.Fb.L.h.                                   0.213223346
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.318861006
## Heating.water.flow.rate.Fh.L.h.                          0.003051813
## Water.for.injection.dilution.Fw.L.h.                     0.024745266
## Air.head.pressure.pressure.bar.                          0.099547498
## Dumped.broth.flow.Fremoved.L.h.                         -0.026474207
## Substrate.concentration.S.g.L.                           0.019268374
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.457431998
## Penicillin.concentration.P.g.L.                          0.025483280
## Vessel.Volume.V.L.                                       0.033832170
## Vessel.Weight.Wt.Kg.                                     0.037844554
## pH.pH.pH.                                               -0.048330696
## Temperature.T.K.                                        -0.014311294
## Generated.heat.Q.kJ.                                     0.065956997
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.127908123
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.272002435
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.010727245
## Oil.flow.Foil.L.hr.                                      0.273698652
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.004999218
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.418614101
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.419555604
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.014679296
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.017593882
## Carbon.evolution.rate.CER.g.h.                           0.091467641
## Viscosity.Viscosity_offline.centPoise.                   0.015415293
## X1.Raman.spec.recorded                                   0.024745266
## X2.PAT.control.PAT_ref.PAT.ref.                          0.024745266
## Batch.reference.Batch_ref.Batch.ref.                     0.024745266
## Batch.ID                                                 0.105283003
## Fault.flag                                               0.105952543
##                                                                   PC4
## Time..h.                                                 0.0376662634
## Aeration.rate.Fg.L.h.                                    0.0195751907
## Sugar.feed.rate.Fs.L.h.                                  0.0154334884
## Acid.flow.rate.Fa.L.h.                                  -0.5343101828
## Base.flow.rate.Fb.L.h.                                   0.0671366580
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.0181085452
## Heating.water.flow.rate.Fh.L.h.                         -0.0970143633
## Water.for.injection.dilution.Fw.L.h.                     0.0228744673
## Air.head.pressure.pressure.bar.                          0.0194621614
## Dumped.broth.flow.Fremoved.L.h.                          0.5188019939
## Substrate.concentration.S.g.L.                           0.0375775332
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.0598165813
## Penicillin.concentration.P.g.L.                          0.0008449866
## Vessel.Volume.V.L.                                       0.0531046332
## Vessel.Weight.Wt.Kg.                                     0.0468210063
## pH.pH.pH.                                               -0.6234959038
## Temperature.T.K.                                        -0.1263224650
## Generated.heat.Q.kJ.                                    -0.0096524075
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0046185345
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.0036456960
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.0379010332
## Oil.flow.Foil.L.hr.                                     -0.0089061164
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.0482690105
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.0550879319
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.0318492482
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.0290159828
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0315018085
## Carbon.evolution.rate.CER.g.h.                           0.0065998913
## Viscosity.Viscosity_offline.centPoise.                  -0.0314555190
## X1.Raman.spec.recorded                                   0.0228744673
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0228744673
## Batch.reference.Batch_ref.Batch.ref.                     0.0228744673
## Batch.ID                                                 0.0222688640
## Fault.flag                                               0.0224685888
##                                                                  PC5
## Time..h.                                                -0.006533934
## Aeration.rate.Fg.L.h.                                    0.007501678
## Sugar.feed.rate.Fs.L.h.                                 -0.014524099
## Acid.flow.rate.Fa.L.h.                                  -0.184566780
## Base.flow.rate.Fb.L.h.                                   0.014129155
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.095407998
## Heating.water.flow.rate.Fh.L.h.                          0.699218207
## Water.for.injection.dilution.Fw.L.h.                    -0.008585032
## Air.head.pressure.pressure.bar.                          0.005740708
## Dumped.broth.flow.Fremoved.L.h.                          0.005576110
## Substrate.concentration.S.g.L.                          -0.007676034
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.025758154
## Penicillin.concentration.P.g.L.                         -0.010752247
## Vessel.Volume.V.L.                                       0.002847072
## Vessel.Weight.Wt.Kg.                                     0.000569354
## pH.pH.pH.                                               -0.074736660
## Temperature.T.K.                                         0.653248431
## Generated.heat.Q.kJ.                                     0.171725273
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.008406209
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.051243973
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.013371214
## Oil.flow.Foil.L.hr.                                      0.021286928
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.020697243
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.011592422
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.013050378
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.007890513
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.011115631
## Carbon.evolution.rate.CER.g.h.                          -0.007356829
## Viscosity.Viscosity_offline.centPoise.                  -0.009788268
## X1.Raman.spec.recorded                                  -0.008585032
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.008585032
## Batch.reference.Batch_ref.Batch.ref.                    -0.008585032
## Batch.ID                                                -0.002087435
## Fault.flag                                              -0.001048552
##                                                                  PC6
## Time..h.                                                 0.012458598
## Aeration.rate.Fg.L.h.                                    0.019927517
## Sugar.feed.rate.Fs.L.h.                                  0.084001301
## Acid.flow.rate.Fa.L.h.                                   0.634501845
## Base.flow.rate.Fb.L.h.                                   0.064712581
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.153236637
## Heating.water.flow.rate.Fh.L.h.                          0.173034518
## Water.for.injection.dilution.Fw.L.h.                     0.004005011
## Air.head.pressure.pressure.bar.                          0.032693183
## Dumped.broth.flow.Fremoved.L.h.                          0.715680253
## Substrate.concentration.S.g.L.                           0.006870687
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.055869896
## Penicillin.concentration.P.g.L.                         -0.003182546
## Vessel.Volume.V.L.                                      -0.068273056
## Vessel.Weight.Wt.Kg.                                    -0.052058357
## pH.pH.pH.                                                0.026955826
## Temperature.T.K.                                        -0.034326417
## Generated.heat.Q.kJ.                                     0.009117316
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.006030151
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.007906023
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.001674480
## Oil.flow.Foil.L.hr.                                      0.046047373
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.003203402
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.024550490
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.033104113
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.004287098
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.003917991
## Carbon.evolution.rate.CER.g.h.                          -0.002009488
## Viscosity.Viscosity_offline.centPoise.                  -0.004535153
## X1.Raman.spec.recorded                                   0.004005011
## X2.PAT.control.PAT_ref.PAT.ref.                          0.004005011
## Batch.reference.Batch_ref.Batch.ref.                     0.004005011
## Batch.ID                                                -0.033304345
## Fault.flag                                              -0.034942561
##                                                                  PC7
## Time..h.                                                -0.014718396
## Aeration.rate.Fg.L.h.                                   -0.055232713
## Sugar.feed.rate.Fs.L.h.                                  0.214304503
## Acid.flow.rate.Fa.L.h.                                  -0.238481494
## Base.flow.rate.Fb.L.h.                                   0.533011470
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.465634085
## Heating.water.flow.rate.Fh.L.h.                          0.209563544
## Water.for.injection.dilution.Fw.L.h.                    -0.021613684
## Air.head.pressure.pressure.bar.                          0.017661664
## Dumped.broth.flow.Fremoved.L.h.                         -0.053836315
## Substrate.concentration.S.g.L.                          -0.022671093
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.096595287
## Penicillin.concentration.P.g.L.                         -0.027833286
## Vessel.Volume.V.L.                                       0.029830922
## Vessel.Weight.Wt.Kg.                                     0.020709369
## pH.pH.pH.                                                0.226972701
## Temperature.T.K.                                        -0.289273760
## Generated.heat.Q.kJ.                                    -0.092361113
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.037573124
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.332611670
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.007227411
## Oil.flow.Foil.L.hr.                                     -0.023273001
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.054257925
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.102995435
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.082540951
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.024543966
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.011734992
## Carbon.evolution.rate.CER.g.h.                           0.015078019
## Viscosity.Viscosity_offline.centPoise.                  -0.017300672
## X1.Raman.spec.recorded                                  -0.021613684
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.021613684
## Batch.reference.Batch_ref.Batch.ref.                    -0.021613684
## Batch.ID                                                -0.164640331
## Fault.flag                                              -0.164261585
##                                                                  PC8
## Time..h.                                                 0.061508759
## Aeration.rate.Fg.L.h.                                    0.133183113
## Sugar.feed.rate.Fs.L.h.                                 -0.075722633
## Acid.flow.rate.Fa.L.h.                                  -0.145875251
## Base.flow.rate.Fb.L.h.                                   0.398866829
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.468240103
## Heating.water.flow.rate.Fh.L.h.                         -0.244972633
## Water.for.injection.dilution.Fw.L.h.                     0.057315094
## Air.head.pressure.pressure.bar.                          0.023639184
## Dumped.broth.flow.Fremoved.L.h.                          0.277077211
## Substrate.concentration.S.g.L.                           0.061681911
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.036602678
## Penicillin.concentration.P.g.L.                          0.044137078
## Vessel.Volume.V.L.                                       0.043139423
## Vessel.Weight.Wt.Kg.                                     0.044568673
## pH.pH.pH.                                                0.392818670
## Temperature.T.K.                                         0.319496158
## Generated.heat.Q.kJ.                                     0.110066552
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.003898025
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.152006994
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.012212893
## Oil.flow.Foil.L.hr.                                     -0.235745559
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.087066818
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.068881185
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.140986160
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.048459624
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.023849756
## Carbon.evolution.rate.CER.g.h.                           0.030886802
## Viscosity.Viscosity_offline.centPoise.                  -0.025725212
## X1.Raman.spec.recorded                                   0.057315094
## X2.PAT.control.PAT_ref.PAT.ref.                          0.057315094
## Batch.reference.Batch_ref.Batch.ref.                     0.057315094
## Batch.ID                                                -0.118874559
## Fault.flag                                              -0.116137514
##                                                                  PC9
## Time..h.                                                -0.022454892
## Aeration.rate.Fg.L.h.                                   -0.049684263
## Sugar.feed.rate.Fs.L.h.                                  0.397333505
## Acid.flow.rate.Fa.L.h.                                   0.109975818
## Base.flow.rate.Fb.L.h.                                  -0.318436441
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.079393983
## Heating.water.flow.rate.Fh.L.h.                         -0.195968338
## Water.for.injection.dilution.Fw.L.h.                    -0.027634043
## Air.head.pressure.pressure.bar.                          0.100806285
## Dumped.broth.flow.Fremoved.L.h.                         -0.067035589
## Substrate.concentration.S.g.L.                          -0.035382828
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.054456829
## Penicillin.concentration.P.g.L.                         -0.029040294
## Vessel.Volume.V.L.                                       0.001764422
## Vessel.Weight.Wt.Kg.                                    -0.002049049
## pH.pH.pH.                                               -0.249627906
## Temperature.T.K.                                         0.258779463
## Generated.heat.Q.kJ.                                     0.068089750
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.051650360
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.540012788
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.001596532
## Oil.flow.Foil.L.hr.                                     -0.065868571
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.019373827
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.188681803
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.141791423
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.008076985
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.006582625
## Carbon.evolution.rate.CER.g.h.                           0.024656572
## Viscosity.Viscosity_offline.centPoise.                   0.003235619
## X1.Raman.spec.recorded                                  -0.027634043
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.027634043
## Batch.reference.Batch_ref.Batch.ref.                    -0.027634043
## Batch.ID                                                -0.290003811
## Fault.flag                                              -0.291069478
##                                                                 PC10
## Time..h.                                                 0.007368023
## Aeration.rate.Fg.L.h.                                    0.078837523
## Sugar.feed.rate.Fs.L.h.                                 -0.353049804
## Acid.flow.rate.Fa.L.h.                                   0.320297359
## Base.flow.rate.Fb.L.h.                                   0.352521800
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.074682240
## Heating.water.flow.rate.Fh.L.h.                          0.078646598
## Water.for.injection.dilution.Fw.L.h.                     0.035819733
## Air.head.pressure.pressure.bar.                         -0.187557538
## Dumped.broth.flow.Fremoved.L.h.                         -0.236798010
## Substrate.concentration.S.g.L.                           0.025889658
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.224826585
## Penicillin.concentration.P.g.L.                          0.055556607
## Vessel.Volume.V.L.                                      -0.005739401
## Vessel.Weight.Wt.Kg.                                    -0.002262903
## pH.pH.pH.                                               -0.471055664
## Temperature.T.K.                                         0.009889009
## Generated.heat.Q.kJ.                                    -0.069392040
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.072981112
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.221537935
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.009895614
## Oil.flow.Foil.L.hr.                                     -0.422204062
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.015372219
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.076919578
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.013336505
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.022221679
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.017415320
## Carbon.evolution.rate.CER.g.h.                          -0.015750406
## Viscosity.Viscosity_offline.centPoise.                  -0.008272521
## X1.Raman.spec.recorded                                   0.035819733
## X2.PAT.control.PAT_ref.PAT.ref.                          0.035819733
## Batch.reference.Batch_ref.Batch.ref.                     0.035819733
## Batch.ID                                                 0.079845706
## Fault.flag                                               0.079690239
##                                                                PC11
## Time..h.                                                -0.06152017
## Aeration.rate.Fg.L.h.                                   -0.17921669
## Sugar.feed.rate.Fs.L.h.                                  0.16144713
## Acid.flow.rate.Fa.L.h.                                  -0.02587831
## Base.flow.rate.Fb.L.h.                                   0.13394244
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.04723808
## Heating.water.flow.rate.Fh.L.h.                         -0.17789397
## Water.for.injection.dilution.Fw.L.h.                    -0.02711510
## Air.head.pressure.pressure.bar.                         -0.09452868
## Dumped.broth.flow.Fremoved.L.h.                          0.04543940
## Substrate.concentration.S.g.L.                          -0.04462277
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.11007323
## Penicillin.concentration.P.g.L.                          0.01558042
## Vessel.Volume.V.L.                                      -0.20876611
## Vessel.Weight.Wt.Kg.                                    -0.17298829
## pH.pH.pH.                                                0.05484241
## Temperature.T.K.                                         0.20960731
## Generated.heat.Q.kJ.                                     0.02018092
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.05276491
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.41170499
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.01491438
## Oil.flow.Foil.L.hr.                                      0.25479056
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.16645118
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.13860344
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.07076252
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.10187712
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.04831666
## Carbon.evolution.rate.CER.g.h.                          -0.05520468
## Viscosity.Viscosity_offline.centPoise.                   0.05962940
## X1.Raman.spec.recorded                                  -0.02711510
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.02711510
## Batch.reference.Batch_ref.Batch.ref.                    -0.02711510
## Batch.ID                                                 0.46076210
## Fault.flag                                               0.46413929
##                                                                 PC12
## Time..h.                                                 0.032018798
## Aeration.rate.Fg.L.h.                                   -0.013148983
## Sugar.feed.rate.Fs.L.h.                                  0.166350279
## Acid.flow.rate.Fa.L.h.                                   0.232543850
## Base.flow.rate.Fb.L.h.                                   0.452277308
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.101367422
## Heating.water.flow.rate.Fh.L.h.                         -0.210731588
## Water.for.injection.dilution.Fw.L.h.                     0.014040660
## Air.head.pressure.pressure.bar.                          0.196495750
## Dumped.broth.flow.Fremoved.L.h.                         -0.194465805
## Substrate.concentration.S.g.L.                           0.022897068
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.489256495
## Penicillin.concentration.P.g.L.                         -0.004241974
## Vessel.Volume.V.L.                                       0.093123122
## Vessel.Weight.Wt.Kg.                                     0.078639443
## pH.pH.pH.                                               -0.231034684
## Temperature.T.K.                                         0.173769229
## Generated.heat.Q.kJ.                                     0.093457013
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.058837974
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.226218393
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.025689800
## Oil.flow.Foil.L.hr.                                      0.179708088
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.297025326
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.070250781
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.011594407
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.167332556
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.057586083
## Carbon.evolution.rate.CER.g.h.                           0.036624931
## Viscosity.Viscosity_offline.centPoise.                   0.100657196
## X1.Raman.spec.recorded                                   0.014040660
## X2.PAT.control.PAT_ref.PAT.ref.                          0.014040660
## Batch.reference.Batch_ref.Batch.ref.                     0.014040660
## Batch.ID                                                -0.069922426
## Fault.flag                                              -0.070409970
##                                                                 PC13
## Time..h.                                                -0.094320360
## Aeration.rate.Fg.L.h.                                    0.153493269
## Sugar.feed.rate.Fs.L.h.                                  0.058303833
## Acid.flow.rate.Fa.L.h.                                  -0.044994814
## Base.flow.rate.Fb.L.h.                                  -0.028205404
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.402237690
## Heating.water.flow.rate.Fh.L.h.                          0.357423112
## Water.for.injection.dilution.Fw.L.h.                    -0.106466855
## Air.head.pressure.pressure.bar.                          0.249617808
## Dumped.broth.flow.Fremoved.L.h.                          0.019872408
## Substrate.concentration.S.g.L.                          -0.144549835
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.215523392
## Penicillin.concentration.P.g.L.                         -0.083719700
## Vessel.Volume.V.L.                                      -0.172097383
## Vessel.Weight.Wt.Kg.                                    -0.149748475
## pH.pH.pH.                                                0.048129297
## Temperature.T.K.                                        -0.340572293
## Generated.heat.Q.kJ.                                     0.008313938
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.080257096
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.141562848
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.043271925
## Oil.flow.Foil.L.hr.                                     -0.224641530
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.391039065
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.089686563
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.053589581
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.220961773
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.082217074
## Carbon.evolution.rate.CER.g.h.                           0.027406660
## Viscosity.Viscosity_offline.centPoise.                   0.120886657
## X1.Raman.spec.recorded                                  -0.106466855
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.106466855
## Batch.reference.Batch_ref.Batch.ref.                    -0.106466855
## Batch.ID                                                 0.053829736
## Fault.flag                                               0.049709984
##                                                                 PC14
## Time..h.                                                -0.066331211
## Aeration.rate.Fg.L.h.                                    0.001282018
## Sugar.feed.rate.Fs.L.h.                                  0.136929824
## Acid.flow.rate.Fa.L.h.                                   0.084626677
## Base.flow.rate.Fb.L.h.                                   0.115263954
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.152867246
## Heating.water.flow.rate.Fh.L.h.                          0.081296062
## Water.for.injection.dilution.Fw.L.h.                    -0.065939900
## Air.head.pressure.pressure.bar.                          0.258950282
## Dumped.broth.flow.Fremoved.L.h.                         -0.089066067
## Substrate.concentration.S.g.L.                          -0.101656089
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.339636486
## Penicillin.concentration.P.g.L.                         -0.037987199
## Vessel.Volume.V.L.                                      -0.145619131
## Vessel.Weight.Wt.Kg.                                    -0.123332109
## pH.pH.pH.                                               -0.142204727
## Temperature.T.K.                                        -0.080386850
## Generated.heat.Q.kJ.                                     0.077260832
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.082017005
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.055716273
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.064464415
## Oil.flow.Foil.L.hr.                                      0.061523551
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.630649655
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.001820586
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.007899085
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.349969319
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.125173039
## Carbon.evolution.rate.CER.g.h.                           0.028734431
## Viscosity.Viscosity_offline.centPoise.                  -0.202042297
## X1.Raman.spec.recorded                                  -0.065939900
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.065939900
## Batch.reference.Batch_ref.Batch.ref.                    -0.065939900
## Batch.ID                                                 0.146012301
## Fault.flag                                               0.145515154
##                                                                 PC15
## Time..h.                                                 0.063365079
## Aeration.rate.Fg.L.h.                                   -0.137547519
## Sugar.feed.rate.Fs.L.h.                                 -0.189339469
## Acid.flow.rate.Fa.L.h.                                   0.071926728
## Base.flow.rate.Fb.L.h.                                  -0.018916448
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.238351618
## Heating.water.flow.rate.Fh.L.h.                          0.162766215
## Water.for.injection.dilution.Fw.L.h.                    -0.036180928
## Air.head.pressure.pressure.bar.                         -0.146866992
## Dumped.broth.flow.Fremoved.L.h.                          0.053153648
## Substrate.concentration.S.g.L.                           0.070782629
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.244682949
## Penicillin.concentration.P.g.L.                         -0.189671835
## Vessel.Volume.V.L.                                       0.517303247
## Vessel.Weight.Wt.Kg.                                     0.399551199
## pH.pH.pH.                                                0.041207076
## Temperature.T.K.                                        -0.101026775
## Generated.heat.Q.kJ.                                    -0.090488498
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.124995338
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.314243154
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.002976423
## Oil.flow.Foil.L.hr.                                      0.319453839
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.001789519
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.107014303
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.146381374
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.036405703
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.004467669
## Carbon.evolution.rate.CER.g.h.                          -0.110165036
## Viscosity.Viscosity_offline.centPoise.                   0.014714814
## X1.Raman.spec.recorded                                  -0.036180928
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.036180928
## Batch.reference.Batch_ref.Batch.ref.                    -0.036180928
## Batch.ID                                                 0.073426950
## Fault.flag                                               0.078438490
##                                                                  PC16
## Time..h.                                                 0.0184051792
## Aeration.rate.Fg.L.h.                                    0.1146565675
## Sugar.feed.rate.Fs.L.h.                                  0.0978933880
## Acid.flow.rate.Fa.L.h.                                   0.0806119141
## Base.flow.rate.Fb.L.h.                                   0.0865316507
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.2572843203
## Heating.water.flow.rate.Fh.L.h.                          0.1950785042
## Water.for.injection.dilution.Fw.L.h.                     0.0401843666
## Air.head.pressure.pressure.bar.                         -0.0811645556
## Dumped.broth.flow.Fremoved.L.h.                         -0.1280154456
## Substrate.concentration.S.g.L.                           0.0323404135
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.2829501577
## Penicillin.concentration.P.g.L.                          0.0645180010
## Vessel.Volume.V.L.                                      -0.0361698448
## Vessel.Weight.Wt.Kg.                                    -0.0213198098
## pH.pH.pH.                                               -0.1585321547
## Temperature.T.K.                                        -0.1511903401
## Generated.heat.Q.kJ.                                     0.0220838850
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0050521496
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.0753118399
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.0007399452
## Oil.flow.Foil.L.hr.                                      0.4910684103
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.0141044198
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.3388721722
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.4969766721
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.0014268662
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0127687718
## Carbon.evolution.rate.CER.g.h.                           0.0315662125
## Viscosity.Viscosity_offline.centPoise.                  -0.0132505434
## X1.Raman.spec.recorded                                   0.0401843666
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0401843666
## Batch.reference.Batch_ref.Batch.ref.                     0.0401843666
## Batch.ID                                                -0.2111153193
## Fault.flag                                              -0.1974276544
##                                                                  PC17
## Time..h.                                                -0.0009414251
## Aeration.rate.Fg.L.h.                                    0.5798467052
## Sugar.feed.rate.Fs.L.h.                                 -0.4800408919
## Acid.flow.rate.Fa.L.h.                                  -0.0462901930
## Base.flow.rate.Fb.L.h.                                  -0.0592740971
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.2092463886
## Heating.water.flow.rate.Fh.L.h.                         -0.1127037877
## Water.for.injection.dilution.Fw.L.h.                     0.0248346686
## Air.head.pressure.pressure.bar.                          0.1571253689
## Dumped.broth.flow.Fremoved.L.h.                          0.0133341035
## Substrate.concentration.S.g.L.                          -0.0230510442
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.1274992656
## Penicillin.concentration.P.g.L.                          0.0798749534
## Vessel.Volume.V.L.                                      -0.1671522727
## Vessel.Weight.Wt.Kg.                                    -0.1246311565
## pH.pH.pH.                                                0.0265994584
## Temperature.T.K.                                         0.0624276978
## Generated.heat.Q.kJ.                                     0.0004925214
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0012538999
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.2412093261
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.0087788538
## Oil.flow.Foil.L.hr.                                      0.3698733541
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.0119654475
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.2592379660
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.0381224364
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.0159359791
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.0160878906
## Carbon.evolution.rate.CER.g.h.                           0.0675714241
## Viscosity.Viscosity_offline.centPoise.                  -0.0049331471
## X1.Raman.spec.recorded                                   0.0248346686
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0248346686
## Batch.reference.Batch_ref.Batch.ref.                     0.0248346686
## Batch.ID                                                -0.0422045393
## Fault.flag                                              -0.0431843816
##                                                                  PC18
## Time..h.                                                -0.0769262121
## Aeration.rate.Fg.L.h.                                    0.4424318850
## Sugar.feed.rate.Fs.L.h.                                  0.2306228054
## Acid.flow.rate.Fa.L.h.                                   0.0333831982
## Base.flow.rate.Fb.L.h.                                   0.0001203153
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.1637239939
## Heating.water.flow.rate.Fh.L.h.                         -0.1186965925
## Water.for.injection.dilution.Fw.L.h.                    -0.1891721574
## Air.head.pressure.pressure.bar.                          0.0375830649
## Dumped.broth.flow.Fremoved.L.h.                         -0.0030281198
## Substrate.concentration.S.g.L.                          -0.1235240546
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.1633385131
## Penicillin.concentration.P.g.L.                         -0.3076843654
## Vessel.Volume.V.L.                                       0.2842796189
## Vessel.Weight.Wt.Kg.                                     0.1950569331
## pH.pH.pH.                                               -0.0096197758
## Temperature.T.K.                                         0.1062893814
## Generated.heat.Q.kJ.                                    -0.0252343567
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.1046938392
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.1084310417
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.0170732109
## Oil.flow.Foil.L.hr.                                     -0.1386169936
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.0255123424
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.1561640049
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.4293636849
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.0220125748
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0273899491
## Carbon.evolution.rate.CER.g.h.                          -0.0855927077
## Viscosity.Viscosity_offline.centPoise.                   0.0067024606
## X1.Raman.spec.recorded                                  -0.1891721574
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.1891721574
## Batch.reference.Batch_ref.Batch.ref.                    -0.1891721574
## Batch.ID                                                 0.1358061205
## Fault.flag                                               0.1114170518
##                                                                 PC19
## Time..h.                                                -0.064061981
## Aeration.rate.Fg.L.h.                                   -0.335177188
## Sugar.feed.rate.Fs.L.h.                                 -0.396774499
## Acid.flow.rate.Fa.L.h.                                   0.018041617
## Base.flow.rate.Fb.L.h.                                   0.013892162
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.076787044
## Heating.water.flow.rate.Fh.L.h.                         -0.085815869
## Water.for.injection.dilution.Fw.L.h.                    -0.127504826
## Air.head.pressure.pressure.bar.                          0.414314092
## Dumped.broth.flow.Fremoved.L.h.                          0.029158323
## Substrate.concentration.S.g.L.                          -0.160414292
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.280648806
## Penicillin.concentration.P.g.L.                         -0.126454396
## Vessel.Volume.V.L.                                       0.140256536
## Vessel.Weight.Wt.Kg.                                     0.106128889
## pH.pH.pH.                                               -0.010977858
## Temperature.T.K.                                         0.030555712
## Generated.heat.Q.kJ.                                     0.219256045
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.453960480
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.045464978
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.020030104
## Oil.flow.Foil.L.hr.                                      0.028252851
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.032605591
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.117608033
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.078463196
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.027917646
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.056002735
## Carbon.evolution.rate.CER.g.h.                           0.196229450
## Viscosity.Viscosity_offline.centPoise.                   0.023571540
## X1.Raman.spec.recorded                                  -0.127504826
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.127504826
## Batch.reference.Batch_ref.Batch.ref.                    -0.127504826
## Batch.ID                                                -0.002469697
## Fault.flag                                              -0.029594081
##                                                                 PC20
## Time..h.                                                -0.058065110
## Aeration.rate.Fg.L.h.                                    0.001532730
## Sugar.feed.rate.Fs.L.h.                                 -0.033877547
## Acid.flow.rate.Fa.L.h.                                   0.008689025
## Base.flow.rate.Fb.L.h.                                   0.004211067
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.005777409
## Heating.water.flow.rate.Fh.L.h.                          0.003254063
## Water.for.injection.dilution.Fw.L.h.                    -0.016299917
## Air.head.pressure.pressure.bar.                         -0.038483814
## Dumped.broth.flow.Fremoved.L.h.                          0.006655604
## Substrate.concentration.S.g.L.                          -0.044893258
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.004042720
## Penicillin.concentration.P.g.L.                          0.052017022
## Vessel.Volume.V.L.                                       0.028371664
## Vessel.Weight.Wt.Kg.                                     0.022961486
## pH.pH.pH.                                               -0.010729526
## Temperature.T.K.                                         0.023051873
## Generated.heat.Q.kJ.                                    -0.088397475
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.116191137
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.012446484
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.328259255
## Oil.flow.Foil.L.hr.                                     -0.001346367
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.049614265
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.024032327
## Oxygen.in.percent.in.off.gas.O2.O2......                -0.024644259
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.466348552
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.790877509
## Carbon.evolution.rate.CER.g.h.                           0.085525674
## Viscosity.Viscosity_offline.centPoise.                  -0.049217644
## X1.Raman.spec.recorded                                  -0.016299917
## X2.PAT.control.PAT_ref.PAT.ref.                         -0.016299917
## Batch.reference.Batch_ref.Batch.ref.                    -0.016299917
## Batch.ID                                                 0.019117420
## Fault.flag                                               0.009716809
##                                                                  PC21
## Time..h.                                                -1.121703e-01
## Aeration.rate.Fg.L.h.                                   -1.758874e-01
## Sugar.feed.rate.Fs.L.h.                                 -2.069655e-03
## Acid.flow.rate.Fa.L.h.                                  -8.447166e-05
## Base.flow.rate.Fb.L.h.                                  -9.115224e-05
## Heating.cooling.water.flow.rate.Fc.L.h.                  1.114930e-02
## Heating.water.flow.rate.Fh.L.h.                          1.773871e-03
## Water.for.injection.dilution.Fw.L.h.                     3.221559e-02
## Air.head.pressure.pressure.bar.                         -2.867438e-02
## Dumped.broth.flow.Fremoved.L.h.                          2.522958e-02
## Substrate.concentration.S.g.L.                          -8.089627e-02
## Dissolved.oxygen.concentration.DO2.mg.L.                 5.834586e-02
## Penicillin.concentration.P.g.L.                          1.919260e-01
## Vessel.Volume.V.L.                                       5.478297e-02
## Vessel.Weight.Wt.Kg.                                     3.849328e-02
## pH.pH.pH.                                                4.278644e-03
## Temperature.T.K.                                         1.850084e-02
## Generated.heat.Q.kJ.                                    -6.754617e-02
## carbon.dioxide.percent.in.off.gas.CO2outgas...           1.768496e-02
## PAA.flow.Fpaa.PAA.flow..L.h..                           -2.425657e-02
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -2.804814e-01
## Oil.flow.Foil.L.hr.                                      1.741453e-02
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  1.542981e-01
## Oxygen.Uptake.Rate.OUR..g.min...1...                     3.165397e-01
## Oxygen.in.percent.in.off.gas.O2.O2......                 2.506273e-01
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  4.751024e-01
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      2.389011e-01
## Carbon.evolution.rate.CER.g.h.                           8.092608e-02
## Viscosity.Viscosity_offline.centPoise.                  -5.808609e-01
## X1.Raman.spec.recorded                                   3.221559e-02
## X2.PAT.control.PAT_ref.PAT.ref.                          3.221559e-02
## Batch.reference.Batch_ref.Batch.ref.                     3.221559e-02
## Batch.ID                                                -8.836214e-03
## Fault.flag                                               3.214699e-02
##                                                                  PC22
## Time..h.                                                -0.2133954733
## Aeration.rate.Fg.L.h.                                   -0.2285876932
## Sugar.feed.rate.Fs.L.h.                                  0.0056679460
## Acid.flow.rate.Fa.L.h.                                  -0.0059378756
## Base.flow.rate.Fb.L.h.                                  -0.0002423424
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.0098614459
## Heating.water.flow.rate.Fh.L.h.                          0.0069077212
## Water.for.injection.dilution.Fw.L.h.                     0.0490201024
## Air.head.pressure.pressure.bar.                         -0.1585252142
## Dumped.broth.flow.Fremoved.L.h.                          0.0391450339
## Substrate.concentration.S.g.L.                          -0.1551100249
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.1165830831
## Penicillin.concentration.P.g.L.                          0.3616488642
## Vessel.Volume.V.L.                                       0.0337915493
## Vessel.Weight.Wt.Kg.                                     0.0215969732
## pH.pH.pH.                                                0.0031926911
## Temperature.T.K.                                         0.0115981179
## Generated.heat.Q.kJ.                                    -0.0654634493
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0943491538
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.0381357137
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.1468840956
## Oil.flow.Foil.L.hr.                                      0.0312430999
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.1015997370
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.4845546136
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.3729060397
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.3197153345
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.0870976421
## Carbon.evolution.rate.CER.g.h.                           0.1881576951
## Viscosity.Viscosity_offline.centPoise.                   0.3586798287
## X1.Raman.spec.recorded                                   0.0490201024
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0490201024
## Batch.reference.Batch_ref.Batch.ref.                     0.0490201024
## Batch.ID                                                 0.0032561035
## Fault.flag                                               0.0171251856
##                                                                 PC23
## Time..h.                                                 0.208243312
## Aeration.rate.Fg.L.h.                                   -0.250152247
## Sugar.feed.rate.Fs.L.h.                                 -0.092749004
## Acid.flow.rate.Fa.L.h.                                  -0.011063729
## Base.flow.rate.Fb.L.h.                                   0.013004355
## Heating.cooling.water.flow.rate.Fc.L.h.                 -0.032383617
## Heating.water.flow.rate.Fh.L.h.                         -0.018774474
## Water.for.injection.dilution.Fw.L.h.                     0.066427881
## Air.head.pressure.pressure.bar.                          0.265682697
## Dumped.broth.flow.Fremoved.L.h.                         -0.028746209
## Substrate.concentration.S.g.L.                           0.177299283
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.070208832
## Penicillin.concentration.P.g.L.                         -0.158479420
## Vessel.Volume.V.L.                                      -0.098038119
## Vessel.Weight.Wt.Kg.                                    -0.077444682
## pH.pH.pH.                                               -0.006685680
## Temperature.T.K.                                        -0.123467194
## Generated.heat.Q.kJ.                                     0.494759391
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.408438594
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.008978641
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.077521453
## Oil.flow.Foil.L.hr.                                      0.009542347
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.012033325
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.314550212
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.215844211
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.064955109
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.160987493
## Carbon.evolution.rate.CER.g.h.                          -0.325977733
## Viscosity.Viscosity_offline.centPoise.                   0.029967834
## X1.Raman.spec.recorded                                   0.066427881
## X2.PAT.control.PAT_ref.PAT.ref.                          0.066427881
## Batch.reference.Batch_ref.Batch.ref.                     0.066427881
## Batch.ID                                                -0.039373269
## Fault.flag                                               0.003109683
##                                                                 PC24
## Time..h.                                                 0.059939764
## Aeration.rate.Fg.L.h.                                   -0.119488605
## Sugar.feed.rate.Fs.L.h.                                 -0.012533450
## Acid.flow.rate.Fa.L.h.                                  -0.001594851
## Base.flow.rate.Fb.L.h.                                  -0.006441692
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.036318771
## Heating.water.flow.rate.Fh.L.h.                          0.041747411
## Water.for.injection.dilution.Fw.L.h.                     0.077452183
## Air.head.pressure.pressure.bar.                          0.584983441
## Dumped.broth.flow.Fremoved.L.h.                         -0.008751749
## Substrate.concentration.S.g.L.                           0.105249651
## Dissolved.oxygen.concentration.DO2.mg.L.                -0.113185519
## Penicillin.concentration.P.g.L.                          0.039507229
## Vessel.Volume.V.L.                                       0.013691104
## Vessel.Weight.Wt.Kg.                                     0.014062644
## pH.pH.pH.                                               -0.003061390
## Temperature.T.K.                                         0.150373359
## Generated.heat.Q.kJ.                                    -0.706223207
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -0.196553049
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.005765153
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    0.022294453
## Oil.flow.Foil.L.hr.                                      0.000734295
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -0.013486538
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -0.004411432
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.087417459
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.040218901
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -0.018044371
## Carbon.evolution.rate.CER.g.h.                          -0.101766751
## Viscosity.Viscosity_offline.centPoise.                   0.048338691
## X1.Raman.spec.recorded                                   0.077452183
## X2.PAT.control.PAT_ref.PAT.ref.                          0.077452183
## Batch.reference.Batch_ref.Batch.ref.                     0.077452183
## Batch.ID                                                 0.058001656
## Fault.flag                                              -0.019348019
##                                                                 PC25
## Time..h.                                                 0.436409041
## Aeration.rate.Fg.L.h.                                   -0.078803225
## Sugar.feed.rate.Fs.L.h.                                 -0.002364755
## Acid.flow.rate.Fa.L.h.                                  -0.002494114
## Base.flow.rate.Fb.L.h.                                  -0.005551966
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.006544252
## Heating.water.flow.rate.Fh.L.h.                          0.007183061
## Water.for.injection.dilution.Fw.L.h.                     0.009751467
## Air.head.pressure.pressure.bar.                         -0.215480958
## Dumped.broth.flow.Fremoved.L.h.                         -0.015972526
## Substrate.concentration.S.g.L.                           0.337523230
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.093139358
## Penicillin.concentration.P.g.L.                         -0.475968707
## Vessel.Volume.V.L.                                      -0.206178884
## Vessel.Weight.Wt.Kg.                                    -0.119432655
## pH.pH.pH.                                               -0.006491864
## Temperature.T.K.                                         0.057716613
## Generated.heat.Q.kJ.                                    -0.224537504
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.437484672
## PAA.flow.Fpaa.PAA.flow..L.h..                           -0.009759106
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.001137262
## Oil.flow.Foil.L.hr.                                      0.011354706
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.004196004
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.231717622
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.196556763
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -0.004296299
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.002711113
## Carbon.evolution.rate.CER.g.h.                           0.101822172
## Viscosity.Viscosity_offline.centPoise.                  -0.001402599
## X1.Raman.spec.recorded                                   0.009751467
## X2.PAT.control.PAT_ref.PAT.ref.                          0.009751467
## Batch.reference.Batch_ref.Batch.ref.                     0.009751467
## Batch.ID                                                -0.022846691
## Fault.flag                                               0.039295921
##                                                                  PC26
## Time..h.                                                 0.0163475520
## Aeration.rate.Fg.L.h.                                   -0.0135959358
## Sugar.feed.rate.Fs.L.h.                                  0.0019256005
## Acid.flow.rate.Fa.L.h.                                  -0.0018061256
## Base.flow.rate.Fb.L.h.                                   0.0024028478
## Heating.cooling.water.flow.rate.Fc.L.h.                  0.0051744514
## Heating.water.flow.rate.Fh.L.h.                          0.0023962589
## Water.for.injection.dilution.Fw.L.h.                     0.0061026013
## Air.head.pressure.pressure.bar.                         -0.0466665552
## Dumped.broth.flow.Fremoved.L.h.                         -0.0015968624
## Substrate.concentration.S.g.L.                           0.0212934496
## Dissolved.oxygen.concentration.DO2.mg.L.                 0.0160340889
## Penicillin.concentration.P.g.L.                         -0.0130292716
## Vessel.Volume.V.L.                                      -0.0166311821
## Vessel.Weight.Wt.Kg.                                    -0.0118725001
## pH.pH.pH.                                               -0.0001319993
## Temperature.T.K.                                        -0.0110039234
## Generated.heat.Q.kJ.                                     0.0384582203
## carbon.dioxide.percent.in.off.gas.CO2outgas...           0.0089521956
## PAA.flow.Fpaa.PAA.flow..L.h..                            0.0015448749
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -0.0076227945
## Oil.flow.Foil.L.hr.                                      0.0099876928
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  0.0048210714
## Oxygen.Uptake.Rate.OUR..g.min...1...                     0.0298617221
## Oxygen.in.percent.in.off.gas.O2.O2......                 0.0170079209
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  0.0118587347
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      0.0067320848
## Carbon.evolution.rate.CER.g.h.                           0.0050325625
## Viscosity.Viscosity_offline.centPoise.                  -0.0157794000
## X1.Raman.spec.recorded                                   0.0061026013
## X2.PAT.control.PAT_ref.PAT.ref.                          0.0061026013
## Batch.reference.Batch_ref.Batch.ref.                     0.0061026013
## Batch.ID                                                 0.7009285919
## Fault.flag                                              -0.7078627166
##                                                                  PC27
## Time..h.                                                 3.824358e-01
## Aeration.rate.Fg.L.h.                                   -2.144494e-02
## Sugar.feed.rate.Fs.L.h.                                  8.181761e-03
## Acid.flow.rate.Fa.L.h.                                   3.850820e-04
## Base.flow.rate.Fb.L.h.                                  -2.032307e-03
## Heating.cooling.water.flow.rate.Fc.L.h.                 -4.750016e-04
## Heating.water.flow.rate.Fh.L.h.                          4.749223e-05
## Water.for.injection.dilution.Fw.L.h.                     1.761230e-01
## Air.head.pressure.pressure.bar.                         -3.459291e-02
## Dumped.broth.flow.Fremoved.L.h.                         -5.273818e-04
## Substrate.concentration.S.g.L.                          -7.816838e-01
## Dissolved.oxygen.concentration.DO2.mg.L.                 5.685468e-04
## Penicillin.concentration.P.g.L.                         -2.588258e-01
## Vessel.Volume.V.L.                                       2.466527e-02
## Vessel.Weight.Wt.Kg.                                    -3.034104e-02
## pH.pH.pH.                                               -1.735305e-04
## Temperature.T.K.                                         8.629823e-03
## Generated.heat.Q.kJ.                                    -3.206117e-02
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -1.344806e-01
## PAA.flow.Fpaa.PAA.flow..L.h..                           -3.283869e-03
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    3.728299e-03
## Oil.flow.Foil.L.hr.                                      4.956661e-03
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -1.403133e-03
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -2.111932e-02
## Oxygen.in.percent.in.off.gas.O2.O2......                -9.939939e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  3.047424e-03
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -7.493784e-03
## Carbon.evolution.rate.CER.g.h.                           1.688498e-01
## Viscosity.Viscosity_offline.centPoise.                   2.164928e-03
## X1.Raman.spec.recorded                                   1.761230e-01
## X2.PAT.control.PAT_ref.PAT.ref.                          1.761230e-01
## Batch.reference.Batch_ref.Batch.ref.                     1.761230e-01
## Batch.ID                                                 4.883384e-03
## Fault.flag                                               7.663584e-05
##                                                                  PC28
## Time..h.                                                 2.691022e-01
## Aeration.rate.Fg.L.h.                                    5.700884e-02
## Sugar.feed.rate.Fs.L.h.                                  9.354123e-03
## Acid.flow.rate.Fa.L.h.                                  -4.440018e-05
## Base.flow.rate.Fb.L.h.                                  -1.691743e-04
## Heating.cooling.water.flow.rate.Fc.L.h.                  6.437068e-04
## Heating.water.flow.rate.Fh.L.h.                          8.952013e-04
## Water.for.injection.dilution.Fw.L.h.                    -2.189527e-02
## Air.head.pressure.pressure.bar.                         -2.008607e-02
## Dumped.broth.flow.Fremoved.L.h.                         -1.008390e-03
## Substrate.concentration.S.g.L.                          -2.330149e-01
## Dissolved.oxygen.concentration.DO2.mg.L.                 8.219678e-03
## Penicillin.concentration.P.g.L.                          3.210617e-01
## Vessel.Volume.V.L.                                       1.855518e-02
## Vessel.Weight.Wt.Kg.                                     4.831416e-02
## pH.pH.pH.                                               -1.037851e-03
## Temperature.T.K.                                         8.279291e-03
## Generated.heat.Q.kJ.                                    -3.313066e-02
## carbon.dioxide.percent.in.off.gas.CO2outgas...           4.231488e-01
## PAA.flow.Fpaa.PAA.flow..L.h..                            2.777682e-03
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -5.412042e-04
## Oil.flow.Foil.L.hr.                                     -1.062298e-03
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  4.383784e-04
## Oxygen.Uptake.Rate.OUR..g.min...1...                     2.013715e-02
## Oxygen.in.percent.in.off.gas.O2.O2......                 2.074701e-02
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -1.411651e-03
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      6.170625e-04
## Carbon.evolution.rate.CER.g.h.                          -7.620279e-01
## Viscosity.Viscosity_offline.centPoise.                   8.691441e-04
## X1.Raman.spec.recorded                                  -2.189527e-02
## X2.PAT.control.PAT_ref.PAT.ref.                         -2.189527e-02
## Batch.reference.Batch_ref.Batch.ref.                    -2.189527e-02
## Batch.ID                                                 3.213801e-03
## Fault.flag                                              -5.756874e-03
##                                                                  PC29
## Time..h.                                                 6.120532e-01
## Aeration.rate.Fg.L.h.                                   -4.064618e-02
## Sugar.feed.rate.Fs.L.h.                                  1.577747e-03
## Acid.flow.rate.Fa.L.h.                                  -1.214094e-04
## Base.flow.rate.Fb.L.h.                                   2.776379e-04
## Heating.cooling.water.flow.rate.Fc.L.h.                  1.301870e-03
## Heating.water.flow.rate.Fh.L.h.                          9.975399e-04
## Water.for.injection.dilution.Fw.L.h.                    -2.672830e-01
## Air.head.pressure.pressure.bar.                         -1.025727e-03
## Dumped.broth.flow.Fremoved.L.h.                          2.712013e-04
## Substrate.concentration.S.g.L.                           1.754361e-02
## Dissolved.oxygen.concentration.DO2.mg.L.                 1.680678e-04
## Penicillin.concentration.P.g.L.                          4.152638e-01
## Vessel.Volume.V.L.                                      -1.035103e-01
## Vessel.Weight.Wt.Kg.                                     1.246625e-01
## pH.pH.pH.                                                1.473822e-04
## Temperature.T.K.                                         1.527968e-03
## Generated.heat.Q.kJ.                                    -8.467692e-03
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -2.374002e-01
## PAA.flow.Fpaa.PAA.flow..L.h..                           -5.663866e-05
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -1.800678e-03
## Oil.flow.Foil.L.hr.                                     -1.538917e-03
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  1.018162e-03
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -5.683822e-03
## Oxygen.in.percent.in.off.gas.O2.O2......                -3.969260e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  9.530681e-04
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      5.998780e-04
## Carbon.evolution.rate.CER.g.h.                           2.871709e-01
## Viscosity.Viscosity_offline.centPoise.                  -8.413957e-04
## X1.Raman.spec.recorded                                  -2.672830e-01
## X2.PAT.control.PAT_ref.PAT.ref.                         -2.672830e-01
## Batch.reference.Batch_ref.Batch.ref.                    -2.672830e-01
## Batch.ID                                                -9.883312e-05
## Fault.flag                                              -2.819672e-03
##                                                                  PC30
## Time..h.                                                 1.230256e-01
## Aeration.rate.Fg.L.h.                                    7.877497e-04
## Sugar.feed.rate.Fs.L.h.                                 -6.628802e-05
## Acid.flow.rate.Fa.L.h.                                  -2.229730e-06
## Base.flow.rate.Fb.L.h.                                   1.545568e-05
## Heating.cooling.water.flow.rate.Fc.L.h.                  3.186020e-05
## Heating.water.flow.rate.Fh.L.h.                          2.080165e-05
## Water.for.injection.dilution.Fw.L.h.                    -3.410205e-02
## Air.head.pressure.pressure.bar.                          5.688225e-04
## Dumped.broth.flow.Fremoved.L.h.                          6.714456e-05
## Substrate.concentration.S.g.L.                           5.618848e-02
## Dissolved.oxygen.concentration.DO2.mg.L.                -2.800477e-04
## Penicillin.concentration.P.g.L.                          8.938592e-02
## Vessel.Volume.V.L.                                       6.068336e-01
## Vessel.Weight.Wt.Kg.                                    -7.741786e-01
## pH.pH.pH.                                               -2.906766e-05
## Temperature.T.K.                                         2.697188e-05
## Generated.heat.Q.kJ.                                    -1.591079e-04
## carbon.dioxide.percent.in.off.gas.CO2outgas...           2.143558e-03
## PAA.flow.Fpaa.PAA.flow..L.h..                           -7.864233e-05
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -1.201987e-02
## Oil.flow.Foil.L.hr.                                     -8.170999e-05
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  4.732881e-03
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -1.054041e-03
## Oxygen.in.percent.in.off.gas.O2.O2......                -1.002596e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  2.992592e-03
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -3.543366e-03
## Carbon.evolution.rate.CER.g.h.                           3.472656e-02
## Viscosity.Viscosity_offline.centPoise.                   8.008736e-03
## X1.Raman.spec.recorded                                  -3.410205e-02
## X2.PAT.control.PAT_ref.PAT.ref.                         -3.410205e-02
## Batch.reference.Batch_ref.Batch.ref.                    -3.410205e-02
## Batch.ID                                                -3.689382e-04
## Fault.flag                                               2.077603e-04
##                                                                  PC31
## Time..h.                                                 2.934142e-03
## Aeration.rate.Fg.L.h.                                   -6.526325e-06
## Sugar.feed.rate.Fs.L.h.                                  9.905780e-06
## Acid.flow.rate.Fa.L.h.                                  -5.206202e-07
## Base.flow.rate.Fb.L.h.                                  -7.790127e-07
## Heating.cooling.water.flow.rate.Fc.L.h.                  4.514214e-06
## Heating.water.flow.rate.Fh.L.h.                          9.917268e-06
## Water.for.injection.dilution.Fw.L.h.                    -8.834319e-04
## Air.head.pressure.pressure.bar.                          3.081947e-05
## Dumped.broth.flow.Fremoved.L.h.                         -1.386713e-06
## Substrate.concentration.S.g.L.                           7.550015e-04
## Dissolved.oxygen.concentration.DO2.mg.L.                -4.634964e-06
## Penicillin.concentration.P.g.L.                          2.122122e-03
## Vessel.Volume.V.L.                                       9.518125e-03
## Vessel.Weight.Wt.Kg.                                    -1.211968e-02
## pH.pH.pH.                                               -1.713164e-06
## Temperature.T.K.                                         1.722041e-05
## Generated.heat.Q.kJ.                                    -9.863655e-05
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -4.164241e-05
## PAA.flow.Fpaa.PAA.flow..L.h..                           -7.435965e-07
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    7.576183e-01
## Oil.flow.Foil.L.hr.                                     -3.697291e-06
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -2.979014e-01
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -1.630360e-05
## Oxygen.in.percent.in.off.gas.O2.O2......                -6.535956e-06
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -1.838119e-01
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      2.188254e-01
## Carbon.evolution.rate.CER.g.h.                           4.753065e-04
## Viscosity.Viscosity_offline.centPoise.                  -5.053152e-01
## X1.Raman.spec.recorded                                  -8.834319e-04
## X2.PAT.control.PAT_ref.PAT.ref.                         -8.834319e-04
## Batch.reference.Batch_ref.Batch.ref.                    -8.834319e-04
## Batch.ID                                                -3.937741e-05
## Fault.flag                                               3.452151e-05
##                                                                  PC32
## Time..h.                                                 0.000000e+00
## Aeration.rate.Fg.L.h.                                    1.480418e-15
## Sugar.feed.rate.Fs.L.h.                                  5.098693e-16
## Acid.flow.rate.Fa.L.h.                                  -8.470456e-17
## Base.flow.rate.Fb.L.h.                                   5.021402e-17
## Heating.cooling.water.flow.rate.Fc.L.h.                 -3.628449e-17
## Heating.water.flow.rate.Fh.L.h.                          3.404993e-17
## Water.for.injection.dilution.Fw.L.h.                    -8.660246e-01
## Air.head.pressure.pressure.bar.                         -2.234824e-16
## Dumped.broth.flow.Fremoved.L.h.                          1.297160e-16
## Substrate.concentration.S.g.L.                           1.116717e-14
## Dissolved.oxygen.concentration.DO2.mg.L.                -1.978694e-16
## Penicillin.concentration.P.g.L.                          9.307275e-15
## Vessel.Volume.V.L.                                       7.648210e-14
## Vessel.Weight.Wt.Kg.                                    -9.579875e-14
## pH.pH.pH.                                               -5.640648e-19
## Temperature.T.K.                                        -3.022664e-16
## Generated.heat.Q.kJ.                                     1.023344e-15
## carbon.dioxide.percent.in.off.gas.CO2outgas...           3.510676e-15
## PAA.flow.Fpaa.PAA.flow..L.h..                           -5.346994e-17
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -3.308645e-12
## Oil.flow.Foil.L.hr.                                      2.533045e-17
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  1.300895e-12
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -2.911353e-16
## Oxygen.in.percent.in.off.gas.O2.O2......                -1.272273e-16
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  8.027419e-13
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -9.555012e-13
## Carbon.evolution.rate.CER.g.h.                          -1.264149e-15
## Viscosity.Viscosity_offline.centPoise.                   2.206775e-12
## X1.Raman.spec.recorded                                   2.897609e-01
## X2.PAT.control.PAT_ref.PAT.ref.                          2.881678e-01
## Batch.reference.Batch_ref.Batch.ref.                     2.880959e-01
## Batch.ID                                                 8.419644e-17
## Fault.flag                                              -2.479307e-16
##                                                                  PC33
## Time..h.                                                 0.000000e+00
## Aeration.rate.Fg.L.h.                                    3.333268e-17
## Sugar.feed.rate.Fs.L.h.                                  9.242865e-18
## Acid.flow.rate.Fa.L.h.                                  -9.434576e-18
## Base.flow.rate.Fb.L.h.                                  -1.068384e-17
## Heating.cooling.water.flow.rate.Fc.L.h.                  7.001312e-19
## Heating.water.flow.rate.Fh.L.h.                          2.576885e-18
## Water.for.injection.dilution.Fw.L.h.                     1.149576e-03
## Air.head.pressure.pressure.bar.                         -1.956364e-17
## Dumped.broth.flow.Fremoved.L.h.                         -1.987380e-18
## Substrate.concentration.S.g.L.                           6.955059e-18
## Dissolved.oxygen.concentration.DO2.mg.L.                 2.859822e-18
## Penicillin.concentration.P.g.L.                         -8.756175e-18
## Vessel.Volume.V.L.                                      -2.147666e-16
## Vessel.Weight.Wt.Kg.                                     2.638422e-16
## pH.pH.pH.                                               -4.775257e-18
## Temperature.T.K.                                         6.336641e-18
## Generated.heat.Q.kJ.                                     3.020115e-17
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -1.570369e-17
## PAA.flow.Fpaa.PAA.flow..L.h..                            1.393522e-17
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...   -2.668129e-17
## Oil.flow.Foil.L.hr.                                      6.089183e-19
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...  1.555737e-17
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -1.163227e-17
## Oxygen.in.percent.in.off.gas.O2.O2......                -3.933464e-18
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  1.065302e-17
## Offline.Biomass.concentratio.X_offline.X.g.L...1...     -6.779168e-18
## Carbon.evolution.rate.CER.g.h.                           5.347822e-17
## Viscosity.Viscosity_offline.centPoise.                   1.651821e-17
## X1.Raman.spec.recorded                                   8.109200e-01
## X2.PAT.control.PAT_ref.PAT.ref.                         -3.264142e-01
## Batch.reference.Batch_ref.Batch.ref.                    -4.856554e-01
## Batch.ID                                                 6.702834e-18
## Fault.flag                                               8.978266e-18
##                                                                  PC34
## Time..h.                                                 0.000000e+00
## Aeration.rate.Fg.L.h.                                    1.103454e-16
## Sugar.feed.rate.Fs.L.h.                                  2.165627e-17
## Acid.flow.rate.Fa.L.h.                                   7.071211e-18
## Base.flow.rate.Fb.L.h.                                   6.986294e-18
## Heating.cooling.water.flow.rate.Fc.L.h.                  5.446834e-18
## Heating.water.flow.rate.Fh.L.h.                          1.126582e-17
## Water.for.injection.dilution.Fw.L.h.                     8.594579e-05
## Air.head.pressure.pressure.bar.                         -9.294397e-17
## Dumped.broth.flow.Fremoved.L.h.                          1.969398e-18
## Substrate.concentration.S.g.L.                           5.621428e-17
## Dissolved.oxygen.concentration.DO2.mg.L.                 1.349775e-17
## Penicillin.concentration.P.g.L.                          4.973219e-17
## Vessel.Volume.V.L.                                       5.581056e-18
## Vessel.Weight.Wt.Kg.                                     6.781326e-17
## pH.pH.pH.                                               -5.788061e-18
## Temperature.T.K.                                        -1.489377e-17
## Generated.heat.Q.kJ.                                     3.749055e-17
## carbon.dioxide.percent.in.off.gas.CO2outgas...          -2.374544e-18
## PAA.flow.Fpaa.PAA.flow..L.h..                            1.864356e-17
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    5.646835e-17
## Oil.flow.Foil.L.hr.                                      1.617641e-17
## NH_3.concentration.off.line.NH3_offline.NH3..g.L...1... -2.025487e-17
## Oxygen.Uptake.Rate.OUR..g.min...1...                    -2.835681e-17
## Oxygen.in.percent.in.off.gas.O2.O2......                 2.127028e-18
## Offline.Penicillin.concentration.P_offline.P.g.L...1... -1.726409e-17
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      9.899569e-18
## Carbon.evolution.rate.CER.g.h.                           2.851237e-17
## Viscosity.Viscosity_offline.centPoise.                  -2.388844e-17
## X1.Raman.spec.recorded                                   9.190928e-02
## X2.PAT.control.PAT_ref.PAT.ref.                         -7.486074e-01
## Batch.reference.Batch_ref.Batch.ref.                     6.566122e-01
## Batch.ID                                                 7.514175e-19
## Fault.flag                                               4.012139e-18
pca$x
##              PC1          PC2          PC3          PC4           PC5
##   [1,] -4.856981  0.286039318 -3.167108725  1.086529787  0.9960426524
##   [2,] -4.568612  0.216107212 -4.421660395  0.398151859  0.5158896563
##   [3,] -4.374270  0.119649913 -4.847848921 -0.558824610  0.2037943658
##   [4,] -4.108053  0.044754039 -5.151540707 -1.270092145 -0.0785613337
##   [5,] -3.711520  2.385509601 -5.337098323 -2.041766339 -0.4463138432
##   [6,] -3.758451 -0.019436735 -5.474794022 -1.935408052 -0.5084295896
##   [7,] -3.709848 -0.012463956 -5.488350570 -1.865546151 -0.6428690365
##   [8,] -3.691217  0.002562939 -5.456567075 -1.708104358 -0.7657935159
##   [9,] -3.831441  0.154907762 -5.267703190  0.094574055 -0.2466408307
##  [10,] -3.861637  0.195145585 -5.183403590  0.560944097 -0.2565561770
##  [11,] -3.314913  0.143932909 -4.724686295  0.892225541 -0.2284598266
##  [12,] -3.408300  0.138919214 -4.559203702  0.855493334 -0.2316327497
##  [13,] -3.467702  0.108669687 -4.378559270  0.566613893 -0.2652835426
##  [14,] -3.483273  0.071911250 -4.287724474  0.182749281 -0.3122391268
##  [15,] -3.438707  0.042979891 -4.279759626 -0.117479582 -0.3520170696
##  [16,] -3.344062  0.033984010 -4.245073017 -0.180169865 -0.3030422774
##  [17,] -3.305345  0.052353972 -4.219058188  0.022344559 -0.2835774379
##  [18,] -3.316693  0.084450677 -4.143289107  0.370439115 -0.2450350582
##  [19,] -3.403649  0.113575356 -4.009979508  0.658421958 -0.2111449649
##  [20,] -3.472514  0.114527896 -3.791724709  0.716728124 -0.2049983667
##  [21,] -3.859052  0.099656192 -3.098183330  0.517453993 -0.1889106097
##  [22,] -3.927427  0.071502346 -2.983175229  0.166758776 -0.1652611453
##  [23,] -3.920517  0.043180003 -2.911819999 -0.139013401 -0.2053341434
##  [24,] -3.862111  0.031868285 -2.907430175 -0.246806260 -0.2230432443
##  [25,] -3.826230  0.046762559 -2.872960626 -0.095297660 -0.1450445691
##  [26,] -4.231474  0.088598680 -2.145676841  0.233104208  0.0139109614
##  [27,] -4.258687  0.109453236 -1.968015129  0.516019647  0.0433157050
##  [28,] -4.383042  0.119012336 -1.760896167  0.579030555  0.1158800202
##  [29,] -4.480434  0.104409061 -1.555827661  0.421518193  0.0936866913
##  [30,] -4.528685  0.078144699 -1.440110249  0.150492359 -0.0081324029
##  [31,] -4.490913  0.046391831 -1.337390106 -0.132299498 -0.0455306247
##  [32,] -4.468840  0.034402609 -1.287964686 -0.280223808 -0.0005006356
##  [33,] -4.460963  0.043250738 -1.263874041 -0.214277206 -0.0026628827
##  [34,] -4.438778  0.063648472 -1.186362691  0.035904266  0.0224924249
##  [35,] -4.474592  0.083982757 -1.007484573  0.299219613 -0.0154055567
##  [36,] -4.533340  0.092243780 -0.758695127  0.443328726 -0.0007958397
##  [37,] -4.623486  0.085848312 -0.548900240  0.384516190 -0.0093107270
##  [38,] -4.718987  0.069994114 -0.366780059  0.186193156 -0.0294316320
##  [39,] -4.708832  0.043432824 -0.199139147 -0.031976430 -0.0594060972
##  [40,] -4.741828  0.030860244 -0.123501358 -0.221792095 -0.0207508459
##  [41,] -4.429143  0.017941518 -0.473797432 -0.216550980 -0.0332604257
##  [42,] -4.414203  0.028131380 -0.465171965 -0.132032706  0.0300117766
##  [43,] -4.429832  0.046996483 -0.361009401  0.077129452  0.0486187519
##  [44,] -4.509206  0.066097829 -0.169342450  0.254362681  0.1345097786
##  [45,] -4.585047  0.071903879  0.051159130  0.322734691  0.2017111798
##  [46,] -4.676473  0.071361449  0.286904771  0.326503372  0.1977733664
##  [47,] -4.786548  0.067176698  0.476251959  0.234653551  0.2471534906
##  [48,] -4.857457  0.053453838  0.695137731  0.079092026  0.2917018802
##  [49,] -4.886236  0.034241003  0.873565024 -0.117970018  0.3234307810
##  [50,] -4.878609  0.018602102  1.051763335 -0.237745781  0.2986027244
##  [51,] -4.903928  0.017111554  1.212486356 -0.255806837  0.2860042159
##  [52,] -4.919056  0.021689488  1.359989436 -0.192838302  0.2836978121
##  [53,] -4.940566  0.026929962  1.573763875 -0.081525553  0.2248181216
##  [54,] -4.981071  0.031299883  1.807895559  0.007366967  0.2276838968
##  [55,] -5.077694  0.035971640  2.005037890  0.026762521  0.2267049950
##  [56,] -5.123709  0.028357934  2.229269749  0.018634188  0.0779345712
##  [57,] -5.136221  0.018337976  2.418900238  0.039845509 -0.1896330617
##  [58,] -5.132945  0.008106047  2.614215205  0.029704610 -0.2461611895
##  [59,] -5.157023  0.001610077  2.743930563  0.001577062 -0.3167240857
##  [60,] -4.933270  3.246328697  2.868845974 -0.347707465 -0.5719213934
##  [61,] -5.002309 -0.030519676  2.712537011 -0.155423786 -0.5311869361
##  [62,] -4.738995 -0.057040936  1.801562839 -0.377284499 -0.9567964354
##  [63,] -4.201769 -0.093075806  0.557876753 -0.563414042 -1.4021484046
##  [64,] -3.716412  0.013995849 -0.225828806 -1.856076040  6.6390386471
##  [65,] -4.457116  0.005046865  0.890463665 -0.789741958  1.7567321531
##  [66,] -4.237534  0.037681472  0.537951881  0.115925281  0.4788084353
##  [67,] -4.152236  0.066479364  0.444205244  0.742644064 -0.1048643829
##  [68,] -4.164992  0.068028083  0.505192405  0.985643631 -0.5192590326
##  [69,] -4.195870  0.039575963  0.593416652  0.847814651 -0.8460034790
##  [70,] -4.238823  0.001290017  0.566403475  0.453429793 -1.0020927084
##  [71,] -4.041191  0.027863406  0.199914369 -0.895211644  4.3246900823
##  [72,] -4.488515 -0.035718673  0.977319116 -0.820282310  1.1435573789
##  [73,] -4.239395 -0.059059762  0.673855156 -0.715784626  0.3280331726
##  [74,] -4.059799 -0.045247902  0.467636985 -0.402114059  0.0290497769
##  [75,] -3.968710 -0.012922980  0.351700065  0.056003158 -0.1789446389
##  [76,] -3.982340  0.019143791  0.358923389  0.446362724 -0.2566626717
##  [77,] -4.007046  0.028461318  0.427765476  0.632091160 -0.3636058010
##  [78,] -4.091471  0.015221940  0.528967874  0.495329263 -0.4415110511
##  [79,] -4.098252 -0.018273608  0.538810641  0.165373649 -0.5416203249
##  [80,] -4.058900 -0.051051868  0.490332464 -0.167017696 -0.6502918592
##  [81,] -4.193346 -0.086308900  2.537879353 -0.207673378 -0.0875457154
##  [82,] -4.360608 -0.048369881  3.018185039  0.068086341  0.3297141433
##  [83,] -4.473604 -0.028399450  3.292883021  0.251568029  0.4608307344
##  [84,] -4.588520 -0.028465282  3.572204568  0.248016473  0.5128461971
##  [85,] -4.676065 -0.040750399  3.741047394  0.113691358  0.4875350917
##  [86,] -4.736589 -0.060150180  3.859502844 -0.087701823  0.3797639458
##  [87,] -4.733657 -0.081277839  3.907621285 -0.270729132  0.2203196309
##  [88,] -4.696474 -0.098968475  3.960578446 -0.397568256  0.0670988662
##  [89,] -4.607533 -0.113417495  3.974046171 -0.466076519 -0.0131734354
##  [90,] -4.559522 -0.114581124  3.937940889 -0.464894383 -0.0810576921
##  [91,] -4.508957 -0.108099971  3.967608292 -0.344860407 -0.1425182674
##  [92,] -4.491039 -0.092501437  3.987005450 -0.160372087 -0.1244933051
##  [93,] -4.514015 -0.077219544  4.034064245  0.016017705 -0.1717280582
##  [94,] -4.522951 -0.072827522  4.073821388  0.142655518 -0.3687003415
##  [95,] -4.529593 -0.077917423  4.121713847  0.162080823 -0.4971838832
##  [96,] -4.531550 -0.091867503  4.190435221  0.085619352 -0.6310593910
##  [97,] -4.492019 -0.106886716  4.189340456  0.009532854 -0.7702387678
##  [98,] -4.462595 -0.122317517  4.205273670 -0.111857328 -0.8436532070
##  [99,] -4.460064 -0.130867918  4.258666838 -0.224841074 -0.7848737201
## [100,] -4.424564 -0.135442016  4.243959697 -0.283660022 -0.7267018835
## [101,]  4.916351 -0.854079668  0.783361364 -2.251121951  0.8919800811
## [102,]  4.747088 -0.906941677  0.816633911 -2.332462321 -1.0882204634
## [103,]  5.052825 -0.888271370  0.598674418 -3.226951290  2.6766508758
## [104,]  4.605943 -0.972939763  0.901613600 -3.470080940 -0.4298838481
## [105,]  4.711115 -1.040549605  0.612615885 -3.917215189 -1.5569738538
## [106,]  4.970053 -1.060510357  0.279050941 -4.899678186  0.7445147806
## [107,]  4.726742 -1.136323772  0.402884534 -5.208787166 -1.5250084573
## [108,]  5.065794 -1.129340207  0.059255365 -6.473158259  2.6996708665
## [109,]  4.570992 -1.214522526  0.476815167 -6.610983173 -0.7681311342
## [110,]  4.693720 -1.278001293  0.146075480 -6.975473677 -1.9746163179
## [111,]  4.561367 -1.038844095 -0.178553186 -4.223363225 -2.6427413201
## [112,]  4.718175 -0.992941701 -0.293091695 -4.271292982 -0.9864303799
## [113,]  4.606146 -0.998597089 -0.293329925 -3.842051347 -2.7008995989
## [114,]  4.714785 -0.944870416 -0.291910367 -4.073685417 -0.3627327181
## [115,]  4.157154 -0.636610482  0.224724638  0.220098662 -1.0259159068
## [116,]  4.417509 -0.556757885  0.102148636 -0.085808982  3.0244798610
## [117,]  3.931124 -0.561678181  0.565014761  0.621810622  0.0112191256
## [118,]  4.014321 -0.548905917  0.340384797  1.086765345 -0.8676702907
## [119,]  4.265134 -0.500694742  0.128034117  0.917741123  1.7408540909
## [120,]  3.911598 -0.519048361  0.451668748  1.271280468 -0.3595761616
## [121,]  3.942642 -0.539970255  0.325531706  1.323199068 -1.1474350806
## [122,]  4.106280 -0.534691318  0.248053322  0.855777440  0.7432539396
## [123,]  3.934363 -0.575541330  0.370593455  0.885962278 -0.9600887755
## [124,]  4.217976 -0.550314110  0.194138882  0.144027919  2.4420173991
## [125,]  3.890037 -0.591746967  0.510590423  0.387046591 -0.2270501120
## [126,]  4.056084 -0.603714873  0.272195262  0.581053735 -1.0527176821
## [127,]  4.347986 -0.556382707 -0.035151311  0.421317164  1.2942634809
## [128,]  4.104976 -0.557123088  0.189657793  0.939995493 -0.6132629482
## [129,]  4.182210 -0.549093402  0.025145090  1.302820970 -1.2905033316
## [130,]  5.643394 17.763983425  0.476269875 -0.303535305 -0.0841317939
## [131,]  4.070640 -0.539919291  0.085836219  1.325616103 -1.1903380152
## [132,]  4.270573 -0.512445170 -0.020738020  0.606818532  2.1646078302
## [133,]  3.901872 -0.564553159  0.297392640  0.692205240 -0.4008301927
## [134,]  4.066006 -0.599873745  0.097877522  0.656040637 -1.2496214738
## [135,]  4.359243 -0.568611789 -0.146076544  0.278305573  1.2543381365
## [136,]  4.131306 -0.578602618  0.071568968  0.729401972 -0.8425088524
## [137,]  4.453952 -0.497961363 -0.143609824  0.307292587  3.5806691639
## [138,]  3.931272 -0.514222929  0.365558174  0.972507554  0.3316839589
## [139,]  4.005623 -0.525989716  0.245311192  1.265071038 -0.7213361380
## [140,]  4.071683 -0.542114144  0.022064625  1.302157552 -1.3139243471
## [141,]  4.268126 -0.545196108 -0.091229392  0.804829766  0.4012109071
## [142,]  4.168377 -0.590605484 -0.190481265  0.813669518 -1.3187556261
## [143,]  4.374987 -0.569196312 -0.266187655  0.343423012  0.9679411571
## [144,]  4.224085 -0.587993073 -0.090080265  0.696904090 -0.9015220886
## [145,]  4.483561 -0.518783293 -0.231401809  0.369587983  2.7356347877
## [146,]  4.026802 -0.522485074  0.165646859  0.967800034  0.1162069633
## [147,]  4.099801 -0.526212750  0.044261020  1.273111486 -0.7053515530
## [148,]  4.173682 -0.539524545 -0.108552805  1.371429129 -1.2953723626
## [149,]  4.315685 -0.534128941 -0.184986821  0.965005220  0.3391784074
## [150,]  4.191308 -0.576380621 -0.200435353  0.987631499 -1.2980346940
## [151,]  4.364419 -0.561644253 -0.233559555  0.478721774  0.8580014053
## [152,]  4.196928 -0.589732347 -0.035596191  0.699387592 -0.9690826797
## [153,]  4.456545 -0.531437441 -0.216503315  0.273026351  2.5222020419
## [154,]  4.065011 -0.542404182  0.151299073  0.826714123 -0.1072482904
## [155,]  4.158048 -0.542191244  0.034880503  1.174599560 -0.9135646298
## [156,]  4.343386 -0.503921608 -0.139269027  0.936301390  1.3637805242
## [157,]  4.069762 -0.528619360  0.094866091  1.179536192 -0.5115317308
## [158,]  4.127020 -0.550986395 -0.027289616  1.200637191 -1.2253105776
## [159,]  4.293720 -0.549092668 -0.058026273  0.782094245  0.3947387371
## [160,]  4.165024 -0.581016618  0.031761049  0.879571308 -1.1728377660
## [161,]  4.382380 -0.546498857 -0.081357705  0.330811295  1.8091704759
## [162,]  4.105452 -0.574013160  0.210631504  0.681491920 -0.5423827381
## [163,]  4.194322 -0.574265689  0.042147844  0.937688763 -1.2716265087
## [164,]  4.421453 -0.535807960 -0.048810985  0.791742170  0.8610904411
## [165,]  4.164636 -0.541716842  0.116817126  1.187741551 -0.9244098496
## [166,]  4.412331 -0.490505196  0.001761828  0.665790054  2.7944338924
## [167,]  3.958752 -0.528615466  0.448764925  0.965004959  0.0588174388
## [168,]  4.013026 -0.553982233  0.306137247  0.996790065 -0.8669574864
## [169,]  4.276838 -0.538179662  0.094216173  0.441153780  1.6915215485
## [170,]  4.058089 -0.573986953  0.311427322  0.629876310 -0.3571781906
## [171,]  4.181513 -0.584575241  0.143685226  0.793191635 -1.0751538069
## [172,]  4.402465 -0.551363868 -0.018043645  0.642354387  0.7653799350
## [173,]  4.198172 -0.553529360  0.121591308  1.033831143 -0.8059721585
## [174,]  4.399579 -0.500291193 -0.002029387  0.699283106  2.2470570703
## [175,]  4.042607 -0.525801679  0.338029781  1.059474981 -0.0788284244
## [176,]  4.088069 -0.542436465  0.193016202  1.158024480 -0.8981793832
## [177,]  4.286362 -0.529906990  0.010905743  0.717793802  1.0896918545
## [178,]  4.119190 -0.569816917  0.175185193  0.802801848 -0.6884279763
## [179,]  4.256928 -0.590072960 -0.033684511  0.842111808 -1.3272983981
## [180,]  4.418281 -0.567498573 -0.134745477  0.661921199  0.0644455360
## [181,]  4.352942 -0.577061298 -0.189444882  1.028033344 -1.4323724422
## [182,]  4.496677 -0.533166211 -0.178180592  0.872935813  0.6642154199
## [183,]  4.252941 -0.541375980 -0.025711003  1.236907353 -1.0454443313
## [184,]  4.504030 -0.497979750 -0.136814523  0.748101234  2.3120396446
## [185,]  4.054377 -0.533846556  0.261117636  1.009096080 -0.3518842639
## [186,]  4.145439 -0.562950471  0.115396378  1.016456901 -1.1957768409
## [187,]  4.411757 -0.546176555 -0.097580847  0.580129474  1.0515223282
## [188,]  4.200218 -0.572006491  0.054301779  0.815087146 -0.8971112163
## [189,]  4.550432 -0.518861109 -0.142103800  0.301373942  2.9430819336
## [190,]  5.401743 17.278781485  0.788839873 -0.626618791 -0.4579676967
## [191,]  4.179360 -0.545209642  0.125531631  1.092569351 -0.8619907023
## [192,]  4.414989 -0.507850853 -0.067608118  0.785284431  1.6598954466
## [193,]  4.118321 -0.535306411  0.215138521  1.058122219 -0.4439306924
## [194,]  4.218644 -0.558020484  0.032261489  1.103586868 -1.1727059927
## [195,]  4.426192 -0.548715152 -0.079397519  0.741645233  0.5384378107
## [196,]  4.242722 -0.571310918  0.013725282  0.909757490 -1.0961123068
## [197,]  4.539485 -0.533972166 -0.135575968  0.444707012  1.9878713667
## [198,]  4.187865 -0.552581984  0.130909387  0.854572422 -0.4479262393
## [199,]  4.317865 -0.559840896 -0.034241751  1.126836481 -1.2489203503
## [200,]  5.819809 17.221573360  0.307135960 -0.501276541  0.2862917021
##                 PC6          PC7          PC8          PC9         PC10
##   [1,] -0.133812084  0.511059210 -0.159111634  2.232329432  1.357691851
##   [2,] -0.126451317  1.230433419  1.213627936  0.790418411  0.892232683
##   [3,] -0.061331835  1.779419025  1.864981438  0.098798364  0.120014173
##   [4,] -0.066931154  1.674312144  1.820304547  0.005049883 -0.726525276
##   [5,]  0.295199724  1.314028828  1.621776086  0.226903282 -0.958302292
##   [6,]  0.652736282  0.661445866  0.833262939  0.601044327 -0.803177291
##   [7,]  1.023727724  0.259153031  0.340511558  0.901992398 -0.372929712
##   [8,]  1.400671804 -0.101449494 -0.154279230  1.198025231  0.165481612
##   [9,] -0.215061761  0.272052821 -0.155981686  1.177736817 -0.306798222
##  [10,] -0.229100720  0.138988700 -0.481299630  1.350460937  0.047927587
##  [11,] -0.316089848 -0.240270622 -0.835607055  0.486587480  0.609151654
##  [12,] -0.276430914  0.101350902 -0.538863521  0.256198253  0.780184694
##  [13,] -0.230144897  0.488391705 -0.131372414 -0.046414055  0.753670020
##  [14,] -0.200644889  0.736228257  0.203596561 -0.250876618  0.548706319
##  [15,] -0.202815785  0.727515409  0.312203057 -0.285587876  0.284385876
##  [16,] -0.217088531  0.495833262  0.150288098  0.007277605  0.044940408
##  [17,] -0.256149528  0.151637674 -0.199135811  0.302930251  0.081310836
##  [18,] -0.285709903 -0.106387921 -0.523201007  0.564159568  0.299609034
##  [19,] -0.284956597 -0.118813617 -0.626350821  0.694275054  0.579988720
##  [20,] -0.262623133  0.078377184 -0.478420821  0.561396342  0.796642763
##  [21,] -0.141089621  0.349959931 -0.588039862  0.212269606  0.063829250
##  [22,] -0.108397400  0.603788759 -0.215033444  0.073716383 -0.089289651
##  [23,] -0.099862296  0.665527494 -0.056597968  0.034331134 -0.316004114
##  [24,] -0.123364838  0.478789799 -0.151696542  0.149101125 -0.486614755
##  [25,] -0.167635199  0.118103460 -0.419969751  0.428392634 -0.465158044
##  [26,] -0.183385654 -0.962103424 -1.086423176 -0.616112174 -0.796425950
##  [27,] -0.196464393 -1.038512121 -1.211728546 -0.560182601 -0.501355018
##  [28,] -0.175022045 -0.866823124 -1.028765014 -0.582300894 -0.288304207
##  [29,] -0.139237487 -0.557453096 -0.702841239 -0.760986741 -0.230362922
##  [30,] -0.104015699 -0.261418794 -0.409497540 -0.951158720 -0.337227398
##  [31,] -0.094853633 -0.185414694 -0.257960136 -1.071897600 -0.510189531
##  [32,] -0.109961604 -0.326656422 -0.268430018 -0.953742375 -0.664654504
##  [33,] -0.141140058 -0.573615164 -0.453838770 -0.717427760 -0.707975618
##  [34,] -0.171086874 -0.833465663 -0.749611463 -0.500611153 -0.567936657
##  [35,] -0.175379228 -0.894997975 -0.948741648 -0.375418479 -0.331899204
##  [36,] -0.162653634 -0.809743881 -0.948794531 -0.396027817 -0.082861609
##  [37,] -0.127930074 -0.548650957 -0.740025092 -0.518486878  0.035762786
##  [38,] -0.083168941 -0.247723991 -0.471169453 -0.619212238  0.020445204
##  [39,] -0.072112580 -0.134972123 -0.288606728 -0.759683185 -0.053694530
##  [40,] -0.072142147 -0.144341990 -0.161245923 -0.692715482 -0.186639066
##  [41,] -0.123408040 -0.458399227  0.016671694 -0.833837855 -0.265729664
##  [42,] -0.159944868 -0.719814174 -0.093940374 -0.659288025 -0.243082975
##  [43,] -0.181978201 -0.898437021 -0.280593950 -0.476126813 -0.093828911
##  [44,] -0.185854948 -0.953072525 -0.322083350 -0.326468941  0.122015996
##  [45,] -0.185637058 -0.902036232 -0.188837806 -0.342149634  0.320577201
##  [46,] -0.166708017 -0.727651518 -0.006863884 -0.407566964  0.481953184
##  [47,] -0.148339205 -0.547762645  0.274798542 -0.464948197  0.565140870
##  [48,] -0.132725577 -0.404549043  0.533391503 -0.531498679  0.591065095
##  [49,] -0.137071135 -0.365545563  0.771975981 -0.595849488  0.542853896
##  [50,] -0.147967879 -0.410931940  0.834140845 -0.592562420  0.498284051
##  [51,] -0.160295206 -0.509913601  0.792358988 -0.456904479  0.494579988
##  [52,] -0.174867263 -0.631002213  0.693121277 -0.321058174  0.552474097
##  [53,] -0.175886216 -0.672501856  0.560199175 -0.221240831  0.678746313
##  [54,] -0.175275893 -0.681858116  0.521453574 -0.165575594  0.837944995
##  [55,] -0.156104683 -0.567481676  0.598760379 -0.109475243  0.951043786
##  [56,] -0.136728703 -0.397209965  0.644508440 -0.198146146  1.049549944
##  [57,] -0.087750712 -0.108191326  0.537521099 -0.326417448  1.134069044
##  [58,] -0.039308883  0.099245095  0.458718852 -0.401549819  1.224025497
##  [59,] -0.013397789  0.249763451  0.478407894 -0.453739928  1.268282063
##  [60,]  0.011280779  0.594942011  0.774035356 -0.618204860  1.308698826
##  [61,]  0.060538681  0.620607511  0.511766966 -0.485436699  0.908848019
##  [62,]  0.006924106  0.669582071  0.661589328 -0.988229145  0.315334500
##  [63,] -0.022862685  0.656413863  0.503073827 -1.341458447 -0.703686659
##  [64,]  0.786227044 -0.119638100  0.419231024 -0.326232040 -0.803137149
##  [65,] -0.554984989 -2.774757097  1.862539383  0.718606275 -0.761939629
##  [66,] -0.453378160 -2.254314711  0.305585117  0.663661484 -0.497838718
##  [67,] -0.316061820 -1.625436301 -0.555281797  0.427527833 -0.079993153
##  [68,] -0.175505711 -0.816806201 -0.778015821 -0.018895672  0.247628132
##  [69,] -0.035658309  0.063128317 -0.615332815 -0.573481157  0.343182942
##  [70,]  0.078098036  0.771802898 -0.261838238 -0.978924454  0.167553578
##  [71,]  0.653566888  0.755275276  0.402535163 -0.636803004 -0.047105436
##  [72,] -0.187116194 -0.710012393  1.844051181 -0.305446678 -0.395292992
##  [73,] -0.139475116 -0.506178411  0.972649308 -0.354620650 -0.693421546
##  [74,] -0.120239787 -0.638438700  0.144386579 -0.172104303 -0.733731230
##  [75,] -0.116417935 -0.775921561 -0.522266066  0.009751251 -0.560996619
##  [76,] -0.093059726 -0.729868182 -0.873091188  0.101744576 -0.279541250
##  [77,] -0.057593326 -0.475195640 -0.896307205 -0.072718935 -0.037991275
##  [78,]  0.005452354 -0.031515548 -0.621734031 -0.314030362  0.013712466
##  [79,]  0.056279681  0.350672893 -0.300474887 -0.610632704 -0.149001788
##  [80,]  0.076547506  0.509478869 -0.128489009 -0.763382858 -0.422230068
##  [81,]  0.338523916  0.611206610 -0.826144913  0.562123415 -0.959729223
##  [82,]  0.249401579  0.077680233 -0.787026569  1.067488934 -0.614334998
##  [83,]  0.197484224 -0.076870987 -0.575810273  1.140543992 -0.319016572
##  [84,]  0.200230123  0.072378761 -0.258674514  1.038543907 -0.109733550
##  [85,]  0.218734975  0.328466668  0.103983211  0.849719789 -0.046924885
##  [86,]  0.238075640  0.573398059  0.402369886  0.667765540 -0.091565272
##  [87,]  0.266430716  0.780194758  0.497218077  0.539273100 -0.210682012
##  [88,]  0.280435487  0.849723745  0.446373996  0.506020940 -0.334981327
##  [89,]  0.270886791  0.757518627  0.306935072  0.508475430 -0.448776668
##  [90,]  0.261299524  0.637707855  0.130861807  0.632044496 -0.549841044
##  [91,]  0.237492844  0.445194719 -0.107371223  0.768429288 -0.531952802
##  [92,]  0.219823890  0.287876197 -0.309534309  0.905147092 -0.430915701
##  [93,]  0.221695462  0.288246804 -0.417661098  0.970067137 -0.290450591
##  [94,]  0.232609825  0.438596166 -0.460180676  0.845358756 -0.165888364
##  [95,]  0.277970761  0.717652420 -0.468932982  0.678032838 -0.084024802
##  [96,]  0.332910084  1.034690417 -0.440834759  0.505919937 -0.074105685
##  [97,]  0.365979608  1.244352700 -0.434548451  0.333769999 -0.111729812
##  [98,]  0.397450760  1.394075646 -0.432678970  0.258176208 -0.197699844
##  [99,]  0.409002842  1.386941058 -0.425880258  0.335266806 -0.280862081
## [100,]  0.390964763  1.252014660 -0.445663693  0.414105111 -0.369550746
## [101,] -2.974423742  0.885186199 -1.330464554  0.052691150  0.830610488
## [102,] -3.352980407  0.342718553 -0.965078345  0.272320914  0.322668444
## [103,] -2.787850784  0.609439190 -1.013080729  0.065512430  0.269723879
## [104,] -3.046649151 -0.322438736  0.053295322  0.396677274  0.111475822
## [105,] -2.543002283  0.239225111 -0.480306818  0.041078801  0.025244772
## [106,] -1.698289159  0.525123911 -0.766883565 -0.145701914  0.101609129
## [107,] -1.696549286  0.030833002 -0.222327820 -0.037663592  0.003276766
## [108,] -0.681393327  0.100477815 -0.340916273 -0.092452625  0.184999555
## [109,] -1.031938652 -0.993311605  0.823226513  0.281446262  0.074173348
## [110,] -0.531958663 -0.428043948  0.211504073 -0.096787813  0.024464119
## [111,]  3.247670687 -0.403295668  0.363320780 -0.433859359 -0.471279744
## [112,]  3.937015708 -0.473045202 -0.352999137 -0.253066826  0.217731047
## [113,]  4.079302143 -0.844302906 -0.712270860  0.099730028  0.683256966
## [114,]  4.776368228 -1.135415196 -1.127355408  0.381620987  1.382794952
## [115,] -0.018644570 -0.066767309  0.151323307 -0.099499702 -0.658059738
## [116,]  0.497319255 -0.114532956 -0.161436004  0.049343628 -0.236990994
## [117,] -0.216371919 -1.143125679  0.671968331  0.567600814 -0.138420661
## [118,] -0.155116507 -0.680929320 -0.081076175  0.394075174  0.002551944
## [119,]  0.296345381 -0.273909756 -0.516941323  0.223121499  0.321705911
## [120,] -0.125080058 -0.577416389  0.204835072  0.318831445  0.393604321
## [121,] -0.015443355  0.229029033 -0.048939508 -0.136093214  0.383598821
## [122,]  0.336864443  0.706427840 -0.074988902 -0.433364430  0.428103708
## [123,]  0.028670707  0.517715116  0.446144292 -0.450265515  0.210203879
## [124,]  0.515836334  0.679143875  0.351941942 -0.484373975  0.165448117
## [125,] -0.115639741 -0.282020576  1.150235421 -0.065265639 -0.126207853
## [126,] -0.076277492 -0.022443217  0.392880577 -0.160673842 -0.273536822
## [127,]  0.303020992  0.052940027 -0.243564159 -0.084744141 -0.164652675
## [128,] -0.128648796 -0.606958982  0.035049398  0.274484651 -0.104755350
## [129,] -0.062388042 -0.163780160 -0.552831775  0.064900118  0.034582872
## [130,]  0.160891097  0.252721092 -0.786098572 -0.212156350  0.195386724
## [131,] -0.014362865  0.196873921 -0.211510872 -0.183502778  0.244018868
## [132,]  0.473678809  0.529278193 -0.070420309 -0.352083403  0.325640330
## [133,] -0.111603153 -0.151789313  1.001784909 -0.133534290  0.030859823
## [134,] -0.055339625  0.285848464  0.500481045 -0.423878740 -0.218534517
## [135,]  0.332890167  0.355295768  0.012559727 -0.364173697 -0.225527399
## [136,] -0.108715646 -0.321941233  0.225530179  0.044735011 -0.299028187
## [137,]  0.478121506 -0.346874279 -0.209924958  0.248186240  0.026019753
## [138,] -0.308485544 -1.458760913  0.840261872  0.729318123  0.088839826
## [139,] -0.212133524 -0.691703380  0.248297520  0.311751913  0.186219967
## [140,] -0.058275286  0.149440915 -0.128063855 -0.130403723  0.154226146
## [141,]  0.286944468  0.649173635 -0.190125966 -0.478317013  0.124216670
## [142,]  0.056093410  0.696723048  0.037865785 -0.459709641 -0.219778304
## [143,]  0.352973028  0.612352684 -0.074898508 -0.442907488 -0.250445759
## [144,] -0.071731287 -0.100091628  0.164538365 -0.121050964 -0.364330859
## [145,]  0.394855043 -0.217382705 -0.232113738  0.116673290 -0.097517412
## [146,] -0.253006066 -1.178748392  0.583608929  0.646290718 -0.037760478
## [147,] -0.198164864 -0.657255865  0.108463570  0.311149538  0.089515464
## [148,] -0.070403626  0.075516064 -0.260232504 -0.123077692  0.123714157
## [149,]  0.244555416  0.526490475 -0.280819095 -0.417325229  0.167457795
## [150,]  0.041053245  0.662295950 -0.036952301 -0.438000834 -0.093303043
## [151,]  0.340879759  0.704787627 -0.055449467 -0.496389280 -0.124919457
## [152,] -0.045963742  0.149914539  0.258325182 -0.235524632 -0.300417958
## [153,]  0.405573723  0.053109521 -0.062092318 -0.033417559 -0.149712550
## [154,] -0.222422070 -0.903666418  0.615231753  0.473909563 -0.162770855
## [155,] -0.169306842 -0.472338964 -0.010801182  0.248650261 -0.048941665
## [156,]  0.239507436 -0.043692333 -0.319230267  0.100473266  0.169877750
## [157,] -0.131063584 -0.310639547  0.304188385  0.153967225  0.150527999
## [158,] -0.039971488  0.342327587  0.011739082 -0.219119086  0.088173636
## [159,]  0.260507491  0.684960837 -0.093127768 -0.440801730  0.093103841
## [160,] -0.009993242  0.480662748  0.196318938 -0.384222716 -0.101271538
## [161,]  0.410310143  0.552013110  0.023105556 -0.304290344 -0.076932021
## [162,] -0.139504051 -0.288928592  0.601259781  0.080429111 -0.224933749
## [163,] -0.091897319  0.029014225 -0.048051142  0.004978098 -0.247598829
## [164,]  0.252978582  0.173151900 -0.507327567 -0.022461861 -0.028683882
## [165,] -0.105609321 -0.191986260 -0.126497107  0.182702391  0.003695192
## [166,]  0.425662345  0.057835460 -0.240107855  0.107378505  0.269413968
## [167,] -0.221437931 -0.709989730  0.906232616  0.388046080  0.176428531
## [168,] -0.141861776 -0.040003418  0.547461895  0.035471652  0.058908647
## [169,]  0.319653374  0.411768816  0.255031979 -0.125862499  0.034578532
## [170,] -0.135174210 -0.202560198  0.807575943  0.102250488 -0.169704571
## [171,] -0.088674045  0.102669975  0.200781940 -0.025325366 -0.262658952
## [172,]  0.220841291  0.221964083 -0.279200478 -0.018741606 -0.148932234
## [173,] -0.102471675 -0.187885990 -0.062476384  0.243096139 -0.128825925
## [174,]  0.345960626  0.006809743 -0.294285443  0.248480728  0.126347729
## [175,] -0.199784319 -0.652679523  0.568130140  0.467927260  0.117043185
## [176,] -0.122464374 -0.017434385  0.232700442  0.118904177  0.081562237
## [177,]  0.258168372  0.451797277  0.056844447 -0.113633036  0.091200296
## [178,] -0.084995181  0.136424796  0.533215887 -0.063343349 -0.111083783
## [179,] -0.029158574  0.490761991  0.053502291 -0.279582233 -0.271726623
## [180,]  0.209373818  0.564407183 -0.304796656 -0.257942549 -0.246323442
## [181,] -0.014605163  0.389279372 -0.451534895 -0.085066172 -0.316526769
## [182,]  0.267757116  0.356732801 -0.673062954 -0.054881153 -0.076369287
## [183,] -0.091447828 -0.028317827 -0.253294606  0.125991935 -0.051047645
## [184,]  0.388900318  0.195707158 -0.333444911 -0.017009377  0.183368147
## [185,] -0.191172126 -0.399152741  0.683725332  0.259565327  0.053512171
## [186,] -0.108203676  0.230245586  0.282545828 -0.095741963 -0.078485936
## [187,]  0.273643928  0.510958552 -0.003772490 -0.259432202 -0.078163673
## [188,] -0.110727037  0.065517428  0.370040930 -0.036568974 -0.249404398
## [189,]  0.427349563  0.124380927 -0.007904646  0.006400032 -0.077315552
## [190,] -0.364455521 -0.849639463  0.881327880  0.436864596 -0.222579039
## [191,] -0.212906065 -0.404951197  0.253566616  0.300750502 -0.111906194
## [192,]  0.248296789  0.052992398 -0.160641614  0.167194079  0.067464906
## [193,] -0.174054846 -0.328063607  0.455793605  0.312185695  0.012347774
## [194,] -0.096214609  0.243535915  0.085894638 -0.054142055 -0.075361509
## [195,]  0.222525944  0.559804698 -0.143654132 -0.253449287 -0.059925591
## [196,] -0.069534141  0.308021564  0.150065280 -0.094895594 -0.225068596
## [197,]  0.364807873  0.364143975 -0.120030553 -0.120808304 -0.114860924
## [198,] -0.201755331 -0.442452658  0.550188131  0.294975952 -0.218001481
## [199,] -0.145789766 -0.027660011 -0.091420804  0.054835800 -0.192941600
## [200,]  0.121514629  0.321258811 -0.436116316 -0.157490875 -0.095872237
##                 PC11          PC12         PC13          PC14         PC15
##   [1,] -0.8768956746  1.0537143274 -0.394210868 -0.0115632047  0.103514222
##   [2,] -0.3950234157  1.1874695583 -0.153309369 -0.0248439444 -0.238345195
##   [3,] -0.2521545974  0.8518141474 -0.046814096 -0.2438917687 -0.290490348
##   [4,] -0.3531127805  0.1334951496  0.086812512 -0.5071297130 -0.244399990
##   [5,] -1.0973871208 -1.3042978435 -1.213492660  1.5532878249 -0.152463234
##   [6,] -0.6614337408 -0.3174077709  0.126372736 -0.5692337006 -0.120404317
##   [7,] -0.7718756465 -0.1636515042  0.101931342 -0.4516614665 -0.088022316
##   [8,] -0.8736866097  0.0747198999  0.066504551 -0.3030259948 -0.061974633
##   [9,] -0.8753233584 -0.4184851564  0.135931220 -0.4396167554 -0.268765308
##  [10,] -0.9417772421 -0.2805756696  0.132602453 -0.3347359495 -0.284556114
##  [11,]  0.4484400275 -0.2480385832  0.258674879  0.1876901869 -0.077667748
##  [12,]  0.5551771009 -0.0128078889  0.256950401  0.2459981418 -0.074355569
##  [13,]  0.6903712817  0.0767370082  0.274820075  0.2368992601 -0.046589865
##  [14,]  0.7497984055  0.0009540722  0.307175935  0.1655522580 -0.011973787
##  [15,]  0.7466313443 -0.2140607723  0.344091719  0.0745698088  0.022527478
##  [16,]  0.7263012668 -0.4111069248  0.344528414  0.0265148254 -0.009230575
##  [17,]  0.6163405170 -0.5788424983  0.341181812  0.0061242530 -0.004672412
##  [18,]  0.5300880582 -0.5772947295  0.323838089  0.0488702195 -0.012706369
##  [19,]  0.4606654263 -0.4258704176  0.299731803  0.1048101096 -0.030592574
##  [20,]  0.5649091239 -0.2566942091  0.301017802  0.1709010757 -0.015780814
##  [21,]  1.1382573103  0.1693431630 -0.097730494  0.2870460527  0.590673806
##  [22,]  1.1661021481  0.1543445717 -0.110588922  0.2041703295  0.603777635
##  [23,]  1.1461332919 -0.0294260696 -0.080033002  0.1066453379  0.636928770
##  [24,]  1.0973869693 -0.2599121526 -0.051652277  0.0392107911  0.663646692
##  [25,]  1.0385337732 -0.4148088302 -0.073795384  0.0167883586  0.666403166
##  [26,] -0.0550657815  0.1278777766 -0.420614729 -0.0757302428 -0.101131731
##  [27,]  0.0021874416  0.2391810349 -0.420071840  0.0171983525 -0.092514816
##  [28,]  0.0227319640  0.4296291319 -0.459050672  0.0469735007 -0.102136699
##  [29,]  0.0733355925  0.5405860583 -0.441196244  0.0463029352 -0.080667035
##  [30,]  0.0714931658  0.5232098994 -0.385182512  0.0007622182 -0.049116570
##  [31,]  0.1553131537  0.3648535170 -0.356068626 -0.0609720141 -0.011020142
##  [32,]  0.1246009990  0.1713409541 -0.369577646 -0.1467325278  0.001472422
##  [33,] -0.0081651173 -0.0003507332 -0.351336785 -0.1956752681  0.012846800
##  [34,] -0.0533099138 -0.0727188571 -0.360517383 -0.1758907287  0.012371951
##  [35,] -0.1111548657 -0.0477643805 -0.345370271 -0.1329442057  0.019728046
##  [36,] -0.0434561534  0.0587050958 -0.357585519 -0.0795102025  0.031031728
##  [37,]  0.0003887523  0.1755209734 -0.364099135 -0.0716291600  0.040390179
##  [38,] -0.0236361854  0.2133276049 -0.376646901 -0.1319571737  0.040621401
##  [39,]  0.0809657926  0.1314623104 -0.341815732 -0.1572961752  0.083017819
##  [40,]  0.0279689677  0.0131679018 -0.353774145 -0.2461684063  0.088893871
##  [41,] -0.0473408249 -0.0682047220 -0.120136615 -0.1999881040 -0.064274376
##  [42,] -0.0684640573 -0.1957252351 -0.142332682 -0.2374428868 -0.087778044
##  [43,] -0.1289153521 -0.2334191685 -0.143381588 -0.2248707040 -0.092266771
##  [44,] -0.1609669677 -0.1657875921 -0.187316664 -0.2126042288 -0.109747322
##  [45,] -0.0886267682 -0.0546737071 -0.197080673 -0.1708510357 -0.101853316
##  [46,] -0.0633587683  0.0440213674 -0.183076556 -0.1516867999 -0.091461897
##  [47,] -0.0469122768  0.1459079213 -0.193737212 -0.1625478612 -0.089300103
##  [48,]  0.0070395836  0.1631564104 -0.199039687 -0.1914861710 -0.074941569
##  [49,]  0.0833703373  0.0988635507 -0.172898660 -0.2220067520 -0.040185823
##  [50,]  0.1154743981 -0.0502183635 -0.126054843 -0.2567129591  0.001562455
##  [51,]  0.0419307826 -0.1968515134 -0.102820432 -0.3102106539  0.022132962
##  [52,] -0.0058152342 -0.3051077146 -0.091266237 -0.3368545975  0.034238901
##  [53,] -0.0571224472 -0.3919526402 -0.061947870 -0.3464304943  0.051363322
##  [54,] -0.0410788843 -0.4128662194 -0.060869800 -0.3421524409  0.063217183
##  [55,] -0.1149345717 -0.3836777552 -0.071931994 -0.3730163830  0.054921291
##  [56,] -0.1306785728 -0.4191345460  0.006259582 -0.3706504879  0.094699246
##  [57,] -0.1984526197 -0.4939968899  0.088131033 -0.3878754046  0.120310618
##  [58,] -0.1450340487 -0.5314349874  0.038848912 -0.4268364871  0.099606717
##  [59,] -0.1568911589 -0.5495592718  0.048363652 -0.4489862321  0.100643868
##  [60,] -0.7312900166 -1.5550399810 -1.198652357  1.6405745285  0.132184414
##  [61,] -0.1315944106 -0.4488435936  0.181625175 -0.3611940365  0.044011721
##  [62,] -0.2097531982 -0.2974174206  0.585929951 -0.1122425901  0.204086794
##  [63,] -0.5073771031  0.1018139874  1.207043636  0.4191976744  0.338933155
##  [64,]  0.0609689811  0.1489236294 -0.019944121  0.0248075625 -0.131693547
##  [65,] -0.0580004578 -0.0295946252  0.779297460  0.4023180063  0.359505641
##  [66,] -0.4215597289 -0.0929503600  0.699813933  0.3927255477  0.186937118
##  [67,] -0.5676270989  0.0858207573  0.675141425  0.4765419849  0.090733386
##  [68,] -0.5664521021  0.3645245522  0.684252027  0.5565770254  0.041346813
##  [69,] -0.4907351342  0.5822571246  0.697968025  0.5702419194  0.017194230
##  [70,] -0.4792380180  0.6893254967  0.660499654  0.4793216253 -0.023471685
##  [71,]  0.1298035563  0.9560001987 -0.300020905  0.1518739394 -0.365233121
##  [72,]  0.1477105798  0.6510469211  0.374088804  0.3274022592  0.054251827
##  [73,] -0.0641890358  0.2396723737  0.355770297  0.1715877418 -0.015614153
##  [74,] -0.2578915056 -0.0418796438  0.339216946  0.1116025631 -0.063664429
##  [75,] -0.4318872035 -0.1231984061  0.354301800  0.1443474313 -0.099710619
##  [76,] -0.5256218450 -0.0013524729  0.316258586  0.1987506733 -0.150677655
##  [77,] -0.4741788014  0.2022675062  0.334965506  0.2922253412 -0.160810952
##  [78,] -0.4521931604  0.3573793732  0.326977177  0.2808968328 -0.177527615
##  [79,] -0.3926180738  0.3757901958  0.353486954  0.2356094603 -0.170445413
##  [80,] -0.4008295208  0.2251105808  0.403415226  0.1525155780 -0.146572240
##  [81,]  0.1972567812 -0.0258792042 -0.350279750 -0.1313498729 -0.295311913
##  [82,]  0.2013699448  0.0688489401 -0.405356330 -0.0560442429 -0.225512489
##  [83,]  0.2706424531  0.2576390425 -0.341820238  0.0740069141 -0.163183579
##  [84,]  0.3621804043  0.4261155927 -0.314254555  0.1327715210 -0.132951938
##  [85,]  0.4183362744  0.5610570352 -0.260707308  0.1640945530 -0.099807845
##  [86,]  0.4200262703  0.5695742768 -0.180415379  0.1472597420 -0.059996150
##  [87,]  0.3708153320  0.4738843985 -0.115182654  0.0946069964 -0.035050743
##  [88,]  0.3056951519  0.2886143856 -0.054574233  0.0290622857 -0.009094552
##  [89,]  0.3224821047  0.0937356516 -0.015051635 -0.0039077486  0.021877609
##  [90,]  0.2101038391 -0.0798055209  0.007460639 -0.0612377189  0.022327080
##  [91,]  0.1474755877 -0.2323608338  0.041956735 -0.0741419411  0.033372608
##  [92,]  0.1133987783 -0.2541164716  0.027086149 -0.0566878642  0.023601720
##  [93,]  0.0398170856 -0.2123090160  0.037974071 -0.0345163368  0.007452441
##  [94,]  0.0008434961 -0.1431430610  0.146041833  0.0385201471  0.042792162
##  [95,]  0.0177950396 -0.0720714007  0.152019689  0.0506582280  0.032251064
##  [96,]  0.0215100742 -0.0577382301  0.151129901  0.0220409342  0.019099489
##  [97,]  0.0463192475 -0.0795041713  0.181596140  0.0126195911  0.020506113
##  [98,]  0.0374175422 -0.1590537001  0.168806009 -0.0483248626  0.004013963
##  [99,]  0.0146408461 -0.2679885301  0.102231253 -0.1405149528 -0.026657907
## [100,]  0.0166958621 -0.3590483845  0.086082656 -0.1733894601 -0.024828339
## [101,] -0.3943434948  0.3229225571 -0.046857125  0.1148833679  0.153115511
## [102,] -0.3228854022  0.0567118984 -0.104052586 -0.0311290060  0.049961915
## [103,] -0.2059951075 -0.2128277773  0.059743955 -0.0183220777  0.074213171
## [104,]  0.0464983724  0.0830429617 -0.077790147  0.0047370042  0.028151161
## [105,] -0.1108799754 -0.0026887928 -0.017618971 -0.0490390042 -0.039261129
## [106,] -0.1279050170 -0.0854194178  0.066811444 -0.0324888840 -0.035309997
## [107,]  0.0266847395  0.0899411195  0.009637887 -0.0077566639 -0.076304418
## [108,]  0.1541487327  0.0487903796  0.036591187  0.0444459403 -0.058207661
## [109,]  0.4193774302  0.3552008593 -0.029176758  0.1177243018 -0.062516505
## [110,]  0.2639071948  0.2934575070  0.039126334  0.0889787494 -0.134903539
## [111,]  0.2372195856 -0.3618521162  0.094355514 -0.1902788866  0.080743132
## [112,]  0.0383308243 -0.1419944527  0.168596456  0.0013475031  0.161960624
## [113,]  0.1137004178  0.3777440387 -0.251705508  0.0716507082  0.002144610
## [114,] -0.0783100797  0.5636096718 -0.075148184  0.2938350864  0.168053470
## [115,]  0.2056542226 -0.7876347795  0.140847015 -0.1979178901 -0.358781019
## [116,]  0.2496090101 -0.7635052151  0.157554754 -0.0870173998 -0.303364180
## [117,]  0.3808168654 -0.3996538511  0.053749305  0.0174437580 -0.307128412
## [118,]  0.1761914660 -0.3685931782  0.044050488  0.0233878554 -0.378515377
## [119,]  0.1961023436 -0.2863439194  0.051631138  0.1087809753 -0.373799354
## [120,]  0.3586420399  0.1007142022 -0.053028478  0.1805242183 -0.389226816
## [121,]  0.2338476698  0.1864952976 -0.001501916  0.1653768454 -0.411283747
## [122,]  0.2525651825  0.1422624310  0.108035204  0.1824678548 -0.333116627
## [123,]  0.3786204665  0.2336153886  0.043493947  0.1511663872 -0.339298184
## [124,]  0.3390673183 -0.0193464554  0.150312200  0.1105918840 -0.247364893
## [125,]  0.4945493780  0.0126633803  0.045003624  0.0687278335 -0.240671379
## [126,]  0.2896687912 -0.2680069392  0.062216272 -0.0303233537 -0.277873056
## [127,]  0.1193858855 -0.4802252957  0.131649228 -0.0329849566 -0.259394527
## [128,]  0.2123517080 -0.3074076934 -0.004846807  0.0033093170 -0.296441109
## [129,]  0.0759378400 -0.2542602192  0.006109740  0.0297189401 -0.341934510
## [130,]  0.3238504054  0.0768916369  0.404135081 -0.2730394781 -0.469127560
## [131,]  0.0873788987  0.0835399803  0.082105181  0.1456881461 -0.294402567
## [132,]  0.1134487801  0.0427199674  0.196995073  0.1723244593 -0.194202749
## [133,]  0.3491647752  0.2346164631  0.066390029  0.1432780951 -0.198008506
## [134,]  0.2304806566 -0.0354980654  0.121621676  0.0391629544 -0.205205986
## [135,]  0.1165702101 -0.3317615057  0.179947490 -0.0121355382 -0.164229089
## [136,]  0.0929468053 -0.3150133018  0.098034552 -0.0337249339 -0.183256359
## [137,]  0.0625654347 -0.4000897289  0.091645346  0.0139084381 -0.149009853
## [138,]  0.3189042753  0.0184781041 -0.042158116  0.1327072461 -0.147719565
## [139,]  0.1750272634  0.0608438567  0.008247265  0.1412614958 -0.178550513
## [140,]  0.0242699291  0.1174570526  0.019967802  0.0965039624 -0.227184798
## [141,]  0.0096707561 -0.0032564342  0.189361249  0.1059539665 -0.131741952
## [142,]  0.1203837009  0.1039995292 -0.169023604 -0.0725372561 -0.310720971
## [143,]  0.0023045169 -0.2262202512  0.107815451 -0.0538659025 -0.142383027
## [144,]  0.1241057908 -0.2289662520  0.003784577 -0.0603405640 -0.159421427
## [145,]  0.0585673582 -0.3634585196  0.033381919 -0.0256760023 -0.106383376
## [146,]  0.2031595813  0.0036275331 -0.153031255  0.0350426291 -0.148231362
## [147,]  0.1390232199  0.0772012859 -0.106591247  0.0840732308 -0.167956095
## [148,]  0.0280545113  0.1294907695 -0.037581295  0.0907884591 -0.180697943
## [149,]  0.0079079660  0.0826534823  0.114204769  0.1205921723 -0.090566429
## [150,]  0.1051161046  0.2229302639 -0.199123031 -0.0294858170 -0.241983629
## [151,] -0.0084183976 -0.0611066963  0.086814073 -0.0093783791 -0.067332994
## [152,]  0.0810966820 -0.0825095914 -0.010061374 -0.0530638153 -0.077883478
## [153,] -0.0099187203 -0.2721475510  0.047472467 -0.0485223177 -0.015497871
## [154,]  0.1097556101 -0.0368513218 -0.098150160 -0.0118676875 -0.040808293
## [155,] -0.0038496092 -0.0481354667 -0.072006166  0.0058065191 -0.069070025
## [156,] -0.0669097898 -0.0089778631 -0.033757834  0.0464480323 -0.050286938
## [157,]  0.1065228276  0.2814023165 -0.145251813  0.0837662240 -0.071670336
## [158,] -0.0090063261  0.2697702516 -0.096708662  0.0458930818 -0.085130313
## [159,] -0.0353465478  0.1114198031  0.062002984  0.0510276658  0.020194024
## [160,]  0.0174990831  0.1299527092 -0.006599224  0.0014934068  0.002899863
## [161,] -0.1175079652 -0.1164594798  0.123273580 -0.0292694685  0.099002866
## [162,]  0.0500866744 -0.0234538228 -0.013732092 -0.0365750863  0.082614718
## [163,] -0.1714535250 -0.1628386672 -0.009374583 -0.1017898743  0.040954362
## [164,] -0.2292785596 -0.2866305496  0.099064026 -0.0444173117  0.109973715
## [165,] -0.1694043428 -0.0323628009 -0.030877240 -0.0184584873  0.062063291
## [166,] -0.1292319348 -0.0240551545  0.040530500  0.0565033631  0.136330690
## [167,]  0.1813535136  0.3524824198 -0.141348120  0.0993578906  0.120913773
## [168,] -0.0130618699  0.2764511250 -0.069051429  0.0319377437  0.108519430
## [169,] -0.0790781234  0.0994625819 -0.038131835 -0.0320344570  0.137294320
## [170,]  0.1031260689  0.1637159032 -0.162591354 -0.0597063098  0.123864724
## [171,] -0.0837546989 -0.0396569079 -0.120676721 -0.1283338379  0.105621789
## [172,] -0.2084245876 -0.2205101763 -0.018060992 -0.1150686908  0.157792468
## [173,] -0.1754165179 -0.0575428504 -0.155760018 -0.1126430884  0.106415939
## [174,] -0.2517627588 -0.0759002829 -0.066340397 -0.0519711087  0.168805620
## [175,]  0.0441201825  0.2824356142 -0.236176708  0.0160272124  0.143946955
## [176,] -0.1128581851  0.2859722862 -0.174821807 -0.0116108288  0.126117882
## [177,] -0.1853262577  0.1925454807 -0.079327679 -0.0258204883  0.175401827
## [178,] -0.0279226739  0.2523289448 -0.161483707 -0.0549417625  0.170529007
## [179,] -0.1449579435  0.0642419407 -0.132372352 -0.1299979292  0.151168359
## [180,] -0.3451136859 -0.1867564925  0.054325439 -0.1351504260  0.244267669
## [181,] -0.3076070956 -0.0943503865 -0.210448337 -0.2090027406  0.104943945
## [182,] -0.4441981987 -0.2354128205  0.071075510 -0.0961754419  0.265549120
## [183,] -0.3205763852  0.0326976349 -0.084272923 -0.0664952072  0.211813468
## [184,] -0.2836727271  0.0107330104  0.077114301  0.0399369857  0.322554418
## [185,] -0.1225886862  0.3236593599 -0.077364500  0.0336357546  0.300774358
## [186,] -0.2410724528  0.2211666244 -0.051023627 -0.0428624890  0.278489596
## [187,] -0.2687977591  0.0384400369  0.048295963 -0.0489935947  0.340184137
## [188,] -0.2268059878  0.0903198646 -0.053962734 -0.0961017080  0.312321483
## [189,] -0.2594634738 -0.1139997131  0.057183973 -0.0564074438  0.397205728
## [190,]  0.1822999207  0.2984652162 -0.095198696 -0.1310153465  0.189108558
## [191,] -0.2415244802  0.1080217995 -0.119462637 -0.0656131221  0.326828197
## [192,] -0.3417217348  0.0598813714 -0.073204155 -0.0543940698  0.347958877
## [193,] -0.1908788865  0.2960997849 -0.194927785 -0.0415943807  0.328138969
## [194,] -0.2690874942  0.2479465227 -0.161229432 -0.0782074028  0.306830544
## [195,] -0.3307385044  0.0715391768  0.002637362 -0.0673221419  0.398008495
## [196,] -0.3423699384  0.1265831479 -0.098511013 -0.1315320815  0.360138503
## [197,] -0.3681747176 -0.0836059483  0.064177096 -0.0848528161  0.468741292
## [198,] -0.2379207081  0.1266012162 -0.114930701 -0.0907235428  0.423420328
## [199,] -0.3455464242  0.0420689393 -0.087514859 -0.1011320612  0.394455066
## [200,] -0.2147262728  0.0864769238  0.061307880 -0.0952106382  0.285040841
##                 PC16         PC17         PC18          PC19          PC20
##   [1,] -1.2772812638  0.532766557 -0.708636808 -0.3632590994  1.948429e-02
##   [2,]  0.2194091263 -0.023834726 -0.154114678 -0.0342256845 -1.357463e-02
##   [3,]  0.3382772510 -0.089456675 -0.025632728  0.0410885905 -4.057402e-02
##   [4,]  0.1691269289 -0.027656527 -0.026202063  0.0390219973 -6.352123e-02
##   [5,]  0.1366006440 -0.038774416  0.083270093 -0.0806204853  3.702010e-01
##   [6,]  0.1561911956  0.005056132 -0.012559914  0.0497030919 -6.380402e-02
##   [7,]  0.2908514875 -0.029176805 -0.001472707  0.0662343054 -5.391093e-02
##   [8,]  0.4493673832 -0.072468185  0.007644938  0.0857034999 -4.197044e-02
##   [9,]  0.3170061026  0.041201191 -0.085136208  0.0520133925 -5.514890e-02
##  [10,]  0.4259098256  0.020314829 -0.100690425  0.0591889155 -4.859855e-02
##  [11,] -0.0997019437 -0.136895213  0.257334255  0.0244169182  8.356508e-04
##  [12,] -0.0795459614 -0.175279920  0.252368740  0.0337329436  3.905658e-03
##  [13,] -0.1572868121 -0.196788299  0.239717265  0.0383684174  3.032062e-03
##  [14,] -0.2629125484 -0.193048424  0.215543349  0.0368770816 -1.619555e-03
##  [15,] -0.3697565063 -0.172066550  0.194522608  0.0321248102 -6.075905e-03
##  [16,] -0.4303134936 -0.245626464  0.234484333 -0.0576943348 -1.258322e-02
##  [17,] -0.4461757876 -0.221562039  0.208445408 -0.0551905207 -9.177834e-03
##  [18,] -0.4014752842 -0.219192076  0.185442157 -0.0491518876 -2.986431e-03
##  [19,] -0.3186235871 -0.234904409  0.152767805 -0.0350059616  2.216218e-03
##  [20,] -0.3284973320 -0.268390730  0.141722601 -0.0259818618  8.061723e-03
##  [21,]  0.5264617871  0.383861434 -0.128330125  0.0345479683  6.233090e-03
##  [22,]  0.4387855545  0.394119268 -0.159835698  0.0426567682  3.680414e-03
##  [23,]  0.3333169478  0.413900947 -0.199032841  0.0423698063 -7.712752e-04
##  [24,]  0.2574829484  0.437093134 -0.222129665  0.0410951676 -2.428732e-03
##  [25,]  0.2241545052  0.457114580 -0.233827465  0.0492355010  3.085734e-03
##  [26,]  0.1096790058 -0.134311302  0.002491709 -0.0516532791 -2.146389e-02
##  [27,]  0.1398854448 -0.167177301 -0.001426719 -0.0410799487 -1.236624e-02
##  [28,]  0.1634015065 -0.187878654 -0.031571451 -0.0228070045 -7.001647e-03
##  [29,]  0.1412991110 -0.212613196 -0.069883575 -0.0145759927 -5.904902e-03
##  [30,]  0.1081265978 -0.224903944 -0.116177693 -0.0129515822 -1.019692e-02
##  [31,] -0.0246710988 -0.217630818 -0.124080777 -0.0100046983 -1.043410e-02
##  [32,] -0.1204909708 -0.188151203 -0.146694858 -0.0015460754 -1.035600e-02
##  [33,] -0.1181520995 -0.172845463 -0.190134214  0.0019187633 -8.543466e-03
##  [34,] -0.1143458241 -0.169320017 -0.201653637  0.0133100817 -1.584353e-03
##  [35,] -0.0810401112 -0.183167566 -0.243584356  0.0242585483  3.403599e-03
##  [36,] -0.1079441553 -0.203501064 -0.262493492  0.0375446243  1.235437e-02
##  [37,] -0.1359311585 -0.218384745 -0.294258220  0.0489875035  1.658207e-02
##  [38,] -0.1795645508 -0.213449761 -0.345413258  0.0693345916  1.435507e-02
##  [39,] -0.2920846332 -0.222235687 -0.360757337  0.0752859862  1.587436e-02
##  [40,] -0.3467832408 -0.204560358 -0.398420598  0.0897705547  1.530306e-02
##  [41,]  0.0841051828  0.239980144  0.272932043 -0.2131929806 -1.132088e-02
##  [42,]  0.1547938220  0.216217362  0.292947865 -0.1825520584 -9.037906e-03
##  [43,]  0.1972484612  0.208354025  0.277181471 -0.1650541018 -4.641913e-03
##  [44,]  0.2236526027  0.203580786  0.256631099 -0.1384523718  1.399432e-04
##  [45,]  0.2349111541  0.171017557  0.248824564 -0.1184699410  7.069924e-03
##  [46,]  0.2564534104  0.140040283  0.219710320 -0.0966342698  9.443502e-03
##  [47,]  0.2693896458  0.118326290  0.190249784 -0.0757658763  1.203310e-02
##  [48,]  0.2185525055  0.107284748  0.168863113 -0.0533308238  1.313961e-02
##  [49,]  0.1570658279  0.088393522  0.154505529 -0.0401428265  1.545870e-02
##  [50,]  0.0866244307  0.079792475  0.132314360 -0.0305885630  1.700973e-02
##  [51,]  0.0581132640  0.086250545  0.091573983 -0.0174739099  1.863734e-02
##  [52,]  0.0439629268  0.087220424  0.066744335 -0.0020688076  2.308456e-02
##  [53,]  0.0310676998  0.084450836  0.032246034  0.0153612308  2.601986e-02
##  [54,]  0.0054726056  0.074918992  0.015682581  0.0351069203  3.291798e-02
##  [55,]  0.0262317688  0.072726127 -0.027924751  0.0613873154  3.481436e-02
##  [56,]  0.0321339703  0.044206897 -0.071274789  0.0639420976  3.928215e-02
##  [57,]  0.0232279044  0.040089571 -0.114589008  0.0672838784  4.065168e-02
##  [58,] -0.0863960620  0.070315712 -0.099864717  0.0996700408  4.511787e-02
##  [59,] -0.1074224887  0.071587127 -0.117538073  0.1178510337  4.797140e-02
##  [60,] -0.0798738841  0.030564023 -0.062652821  0.0682346511 -3.822380e-01
##  [61,] -0.0781639642 -0.151087245 -0.046189320 -0.0905101269  2.846356e-02
##  [62,]  0.1164399959 -0.220347574 -0.106414159 -0.2418818472  1.424725e-02
##  [63,] -0.0316734930 -0.005431590 -0.203950365 -0.2349573751 -3.288040e-02
##  [64,] -0.5079739617  0.256257190  0.216528843  0.0648666998 -1.534545e-02
##  [65,]  0.0723184093 -0.194491071 -0.153090989 -0.0464835711 -4.798724e-03
##  [66,]  0.0816331962 -0.019928450 -0.088350039 -0.0417108785 -5.364735e-03
##  [67,]  0.1481734037  0.040554802 -0.051210706 -0.0412233228  1.013642e-03
##  [68,]  0.1969548458  0.045077937 -0.034426650 -0.0372392387  5.152811e-03
##  [69,]  0.1643053129  0.049388318 -0.024192351 -0.0317188399  3.758349e-03
##  [70,]  0.0983691485  0.084914204 -0.025343164 -0.0131501547 -4.021765e-03
##  [71,] -0.4359311634  0.303597219  0.285291628  0.2104793036  3.703984e-03
##  [72,] -0.1516254287 -0.026278328  0.007241481  0.1123516637  2.680873e-03
##  [73,] -0.3183139904  0.126560725  0.049811143  0.1099661878 -4.544172e-03
##  [74,] -0.3617035184  0.215669899  0.073441824  0.1078633761 -2.334390e-03
##  [75,] -0.2728979756  0.240425052  0.076969286  0.1101589579  2.948504e-03
##  [76,] -0.1771985157  0.246587343  0.079697084  0.1285910809  9.147525e-03
##  [77,] -0.1033066613  0.211063709  0.088129201  0.1372669729  1.473048e-02
##  [78,] -0.0843312515  0.197592971  0.074196897  0.1551559265  1.463087e-02
##  [79,] -0.1282182970  0.192782469  0.070247722  0.1645425388  1.016649e-02
##  [80,] -0.1907488715  0.204329102  0.054871844  0.1615935134  5.481176e-03
##  [81,]  0.0281032258  0.095156102  0.310167135 -0.0835789262 -4.395706e-02
##  [82,] -0.1009008526  0.111256259  0.230340793 -0.0888361948 -2.984034e-02
##  [83,] -0.0205954822  0.031378409  0.183794889 -0.0881391826 -1.908422e-02
##  [84,]  0.0200806762 -0.030317454  0.156069859 -0.0688999607 -1.212659e-02
##  [85,]  0.0537323764 -0.079817394  0.121710027 -0.0590223316 -9.841380e-03
##  [86,]  0.0860153061 -0.121191430  0.080614592 -0.0576947710 -7.948113e-03
##  [87,]  0.0693189955 -0.123228826  0.045580413 -0.0541702657 -9.831294e-03
##  [88,]  0.0271304722 -0.112066876  0.016523003 -0.0486794081 -1.087365e-02
##  [89,] -0.0605520186 -0.096128441  0.019999278 -0.0503929996 -6.846915e-03
##  [90,] -0.0635238829 -0.075352528 -0.001799890 -0.0376277623 -7.424317e-03
##  [91,] -0.0475349635 -0.077816579 -0.012738973 -0.0259290149 -2.979670e-03
##  [92,] -0.0265061883 -0.075543526 -0.010385828 -0.0113968570  4.921011e-03
##  [93,]  0.0664378536 -0.095243826 -0.029363357  0.0122486098  7.763743e-03
##  [94,]  0.1668948473 -0.142171106 -0.062321745  0.0001622730  1.283190e-02
##  [95,]  0.1737587948 -0.146826461 -0.057097588  0.0107999434  1.827583e-02
##  [96,]  0.1435432402 -0.136709766 -0.059076841  0.0296314522  1.912140e-02
##  [97,]  0.1320653593 -0.141615659 -0.051750437  0.0412257276  2.058596e-02
##  [98,]  0.0873852406 -0.122197802 -0.047192806  0.0669188376  1.974552e-02
##  [99,]  0.0213908162 -0.088327495 -0.042748929  0.1045563770  2.044353e-02
## [100,] -0.0243900680 -0.073266313 -0.039343641  0.1182108224  2.345780e-02
## [101,]  0.1455586887 -0.040075554  0.086520705  0.1075165319  5.355892e-02
## [102,] -0.0220379367  0.052390884  0.080269889  0.0943858386  3.592751e-02
## [103,]  0.0223319441 -0.013116787  0.014733898  0.0503112292  2.073570e-02
## [104,] -0.0413666760 -0.023805382  0.017464197  0.0655067718  1.355359e-02
## [105,] -0.0786731584  0.072157748  0.010540705 -0.0014755099  7.397580e-04
## [106,]  0.0132038108  0.039140300 -0.023339504 -0.0419932806 -8.902584e-03
## [107,] -0.0311365383  0.044704117 -0.021391303 -0.0500388430 -1.767627e-02
## [108,]  0.0830268515 -0.042888912 -0.038594413 -0.0590054337 -2.378427e-02
## [109,]  0.0624144807 -0.093125384 -0.060849318 -0.0509649050 -3.174816e-02
## [110,]  0.0549282368 -0.006451169 -0.062895986 -0.1203727143 -4.290134e-02
## [111,] -0.3866186784  0.086819018 -0.016977902 -0.0040985861 -6.104936e-04
## [112,] -0.0841254910 -0.014910122 -0.040894768 -0.0146741322  1.343191e-02
## [113,] -0.1631505876  0.093140875  0.127254197  0.0777496381  2.319686e-02
## [114,]  0.2201473712 -0.087591197  0.041652155  0.0507011359  3.964944e-02
## [115,] -0.2904087266  0.204190121 -0.154168957 -0.0385161590 -1.452150e-02
## [116,] -0.1266253285  0.099143081 -0.162318993 -0.0261097918 -4.856295e-03
## [117,] -0.0632701303  0.042279264 -0.169869445  0.0174675931 -1.068331e-03
## [118,] -0.0162709420  0.113904642 -0.140936036 -0.0068140515  2.429531e-03
## [119,]  0.0850252008  0.068690492 -0.118658757 -0.0055756922  8.475327e-03
## [120,]  0.0682870221  0.046778211 -0.103896579  0.0194614529  1.138660e-02
## [121,]  0.0576383697  0.097348754 -0.107050734 -0.0142386208  6.912725e-03
## [122,]  0.0781512016  0.049181896 -0.132518252 -0.0444510369  7.772955e-03
## [123,] -0.0181091785  0.061407405 -0.105373105 -0.0283666302  4.703036e-03
## [124,]  0.0378728898 -0.004174036 -0.150546563 -0.0324325666  9.510440e-05
## [125,] -0.0680145000 -0.005585919 -0.131020594  0.0077646103 -2.241784e-03
## [126,] -0.1443732245  0.098037906 -0.097868710 -0.0210617145 -3.258523e-03
## [127,] -0.0003197474  0.066162609 -0.116055150 -0.0234710446 -3.360502e-03
## [128,] -0.0304243465  0.076596179 -0.073877642  0.0100119713  2.472037e-03
## [129,]  0.0047916340  0.124545243 -0.049287816 -0.0128052340  5.088006e-03
## [130,]  0.1104558891  0.113677348 -0.156065323 -0.0325003088  3.157504e-04
## [131,]  0.1691747435  0.032681593 -0.092535881 -0.0258790137  6.877947e-03
## [132,]  0.2761237350 -0.071260564 -0.148437742 -0.0364377084  5.363830e-03
## [133,]  0.1623310068 -0.084215538 -0.123536793  0.0090780422  1.923555e-03
## [134,]  0.0358790505  0.005407556 -0.091786141 -0.0259167195 -1.868920e-03
## [135,]  0.0763340772 -0.007016453 -0.102978346 -0.0340098096 -1.923455e-03
## [136,]  0.0371652624  0.023029964 -0.096620478 -0.0085758162 -4.198639e-03
## [137,]  0.1810049030 -0.050073940 -0.105824644  0.0155572165 -3.409653e-04
## [138,]  0.1984149196 -0.118648018 -0.088917411  0.0623553744  7.533321e-03
## [139,]  0.1665431830 -0.043443506 -0.067749168  0.0167410746  7.979927e-03
## [140,]  0.1520883226  0.026857558 -0.054894939 -0.0162339993  6.699573e-03
## [141,]  0.1916234058 -0.031077124 -0.094949919 -0.0529035283  3.980255e-03
## [142,] -0.0917172802  0.140895008  0.034544622  0.0239721654 -6.226831e-03
## [143,]  0.0714986691  0.016638424 -0.064957589 -0.0240337694 -5.624573e-03
## [144,] -0.0279190066  0.038235602 -0.012949258  0.0085872841 -4.549613e-03
## [145,]  0.1007956937 -0.028165946 -0.037349214  0.0179964224 -6.331879e-06
## [146,]  0.1139821771 -0.050822320 -0.020720160  0.0772312977  2.569123e-03
## [147,]  0.1269434111 -0.020329174  0.008896105  0.0428865210  7.232259e-03
## [148,]  0.1377544999  0.015133892  0.013263085  0.0036714879  6.885853e-03
## [149,]  0.2066986970 -0.050472006 -0.032259842 -0.0338729918  7.288007e-03
## [150,] -0.0629003465  0.108883244  0.077016706  0.0287707570 -2.184297e-03
## [151,]  0.0848740103 -0.012187883 -0.031066539 -0.0246306349 -2.926253e-03
## [152,] -0.0502346925  0.027909756  0.005443477  0.0012314889 -4.974489e-03
## [153,]  0.0827774578 -0.041278076 -0.032867589  0.0055785840 -3.087443e-03
## [154,]  0.0648748344 -0.052358800 -0.016065032  0.0554149552 -2.086600e-03
## [155,]  0.0424507783  0.009329302  0.016565670  0.0224212528  1.286753e-03
## [156,]  0.1474324246 -0.027459260  0.002793366  0.0146186859  3.537625e-03
## [157,]  0.0921747060 -0.033875703  0.034273835  0.0396726363  5.565344e-03
## [158,]  0.0502955852  0.022910881  0.039043079  0.0068333395  2.280605e-03
## [159,]  0.0592664115 -0.021599977 -0.001942318 -0.0356033514  2.459284e-03
## [160,] -0.0409891234  0.015325804  0.024784387 -0.0197564430 -1.425256e-03
## [161,]  0.0601203014 -0.047127226 -0.047425536 -0.0338495948 -5.475235e-03
## [162,] -0.0527977333 -0.032828966 -0.004186065  0.0091046544 -5.649836e-03
## [163,] -0.0815307997  0.057236271  0.010410473 -0.0167455742 -6.074838e-03
## [164,] -0.0037532049  0.010568926 -0.007833682 -0.0403849447 -1.628959e-03
## [165,] -0.0054667469  0.020474367  0.015899604 -0.0103528159  4.860491e-05
## [166,]  0.1188922894 -0.078806603 -0.012039690 -0.0061854909  2.281355e-03
## [167,]  0.0136101687 -0.102471815  0.027774098  0.0463770490  3.853532e-03
## [168,] -0.0196458314 -0.032448070  0.015463376  0.0071485414 -1.828907e-03
## [169,] -0.0384911966 -0.024847634  0.008032633  0.0003164844 -6.511265e-03
## [170,] -0.1775109377 -0.004433580  0.058418206  0.0331830425 -5.963495e-03
## [171,] -0.2278739298  0.075120499  0.072645139  0.0031527223 -8.009107e-03
## [172,] -0.1365933497  0.043221416  0.046771836 -0.0182466027 -6.334751e-03
## [173,] -0.1661496846  0.072570657  0.078482219  0.0125329350 -4.374282e-03
## [174,]  0.0002405333 -0.010686706  0.030091145  0.0092439357 -4.162287e-03
## [175,] -0.0750237555 -0.036534475  0.086191541  0.0555451285  1.568249e-03
## [176,] -0.0672629749  0.010923597  0.079575254  0.0207698408 -1.918867e-03
## [177,] -0.0072515544 -0.022616268  0.048589736  0.0023494744 -4.730804e-03
## [178,] -0.1398096950 -0.001513531  0.090440576  0.0202394739 -5.814435e-03
## [179,] -0.2095419204  0.068841157  0.119539288 -0.0070592686 -6.772658e-03
## [180,] -0.0861654922  0.019404834  0.047013228 -0.0466230612 -7.433472e-03
## [181,] -0.2434065094  0.144134343  0.153112764  0.0074374029 -9.508835e-03
## [182,] -0.0043312726  0.001478207  0.044266633 -0.0445958597 -4.881454e-03
## [183,] -0.0280244536  0.008563847  0.090179579 -0.0098521800 -1.603812e-04
## [184,]  0.1461135281 -0.127372362  0.039761067 -0.0213720445  6.962917e-04
## [185,]  0.0692215095 -0.127437357  0.046527977  0.0221658116 -1.722449e-03
## [186,] -0.0367456964 -0.037170080  0.070441282 -0.0142204935 -4.628261e-03
## [187,]  0.0074468764 -0.079067586  0.057571276 -0.0337945092 -4.201129e-03
## [188,] -0.0711551481 -0.045593843  0.080640738 -0.0079588734 -5.759127e-03
## [189,]  0.0513924087 -0.132974387  0.049197076 -0.0050273552 -7.462588e-03
## [190,] -0.0945292271 -0.076358550  0.065454966  0.0583214025  7.413986e-03
## [191,] -0.0505567031 -0.054017943  0.104782726  0.0138453274 -2.487277e-03
## [192,]  0.0266203954 -0.072238399  0.086794782  0.0064964565 -4.204574e-03
## [193,] -0.0634724681 -0.059486404  0.116190718  0.0323329333 -3.214718e-03
## [194,] -0.1161910510 -0.002167094  0.144432094  0.0003512244 -3.421256e-03
## [195,] -0.0591186357 -0.053894010  0.104025383 -0.0346310620 -4.312171e-03
## [196,] -0.1265448173 -0.007498196  0.118762077 -0.0138028677 -7.893171e-03
## [197,] -0.0046895007 -0.106484808  0.075486679 -0.0277244271 -8.137764e-03
## [198,] -0.0575542807 -0.097212694  0.109503067  0.0209752463 -6.061269e-03
## [199,] -0.1016308616 -0.029292046  0.149163075 -0.0109118762 -3.867250e-03
## [200,] -0.0245192013 -0.040182370  0.095251599 -0.0267247887  1.239733e-02
##                 PC21          PC22          PC23          PC24          PC25
##   [1,] -2.136951e-02 -0.0068936176 -0.0688776044 -2.400782e-02  0.0084777609
##   [2,]  1.628447e-02  0.0322981804 -0.0507824918  7.704971e-02  0.0311038143
##   [3,]  2.285523e-02  0.0376522855 -0.0300010555  6.478773e-02  0.0162010168
##   [4,]  1.942038e-02  0.0328895200 -0.0114478139  2.900579e-02 -0.0024639423
##   [5,]  2.520074e-02 -0.0306720461  0.0346836924 -1.256391e-03 -0.0001832372
##   [6,]  7.820286e-03  0.0134788991 -0.0047734239 -9.960963e-03 -0.0142550046
##   [7,]  1.144855e-03  0.0034660782  0.0017687945 -2.272042e-02 -0.0152961961
##   [8,] -6.901526e-03 -0.0082297778  0.0110613323 -3.647501e-02 -0.0172170994
##   [9,] -1.491321e-02 -0.0035590310  0.0444343274 -3.114766e-02 -0.0087808175
##  [10,] -2.237756e-02 -0.0107676044  0.0611459083 -4.543936e-02 -0.0096009688
##  [11,]  8.039009e-03  0.0147286309  0.0142667996  1.051552e-02  0.0150681111
##  [12,]  7.039156e-03  0.0129051814  0.0180042967  7.649078e-03  0.0118266687
##  [13,]  6.354487e-03  0.0084052165  0.0212446210  1.738160e-03  0.0037739222
##  [14,]  5.980776e-03  0.0051438385  0.0204873301 -4.583319e-03 -0.0031049854
##  [15,]  5.365771e-03  0.0021586131  0.0153251478 -7.487156e-03 -0.0059337103
##  [16,]  2.461233e-03 -0.0019886065 -0.0234708824  6.063968e-03 -0.0014546981
##  [17,] -5.616489e-03 -0.0126838241 -0.0252788109  8.337486e-03 -0.0018485744
##  [18,] -1.185542e-02 -0.0213213918 -0.0211609724  5.542599e-03  0.0014548776
##  [19,] -2.053146e-02 -0.0311225705 -0.0126377874  1.607554e-04 -0.0021140932
##  [20,] -2.497292e-02 -0.0387817936 -0.0079682145 -3.413649e-03 -0.0078475224
##  [21,]  6.090713e-03  0.0130309502  0.0145370551 -7.508126e-03  0.0079329376
##  [22,]  3.494759e-03  0.0070084880  0.0048604371 -1.557066e-03  0.0031907674
##  [23,] -4.856877e-04 -0.0012986420  0.0031318509 -7.487401e-03 -0.0036384865
##  [24,] -3.655328e-03 -0.0068590972 -0.0002973266 -1.223919e-02 -0.0045294291
##  [25,] -1.004880e-02 -0.0163819318 -0.0136749555  8.770285e-04 -0.0011387976
##  [26,]  4.195645e-02  0.0673557858  0.0121555955  9.868241e-03  0.0251665410
##  [27,]  3.735301e-02  0.0596860115  0.0159911783  7.809520e-03  0.0257524807
##  [28,]  3.144455e-02  0.0500107474  0.0141683591  1.158239e-02  0.0233800688
##  [29,]  2.680985e-02  0.0424509537  0.0152158364  8.809110e-03  0.0154151593
##  [30,]  2.252254e-02  0.0363515562  0.0212326448 -5.403494e-03  0.0054945527
##  [31,]  2.078437e-02  0.0302124178  0.0135493692 -3.274816e-03  0.0014515043
##  [32,]  1.711720e-02  0.0214758701  0.0022316951  1.172469e-03  0.0026325073
##  [33,]  9.452568e-03  0.0120045724 -0.0084222742  9.224477e-03  0.0030245075
##  [34,]  2.186151e-03  0.0018852880 -0.0127340316  1.370351e-02  0.0049497896
##  [35,] -8.076000e-03 -0.0131837202  0.0019113942 -2.042002e-03 -0.0014603381
##  [36,] -1.594340e-02 -0.0260113003  0.0008336801  2.443261e-03 -0.0060953433
##  [37,] -2.140868e-02 -0.0349716957 -0.0028044185  5.360614e-03 -0.0102449574
##  [38,] -3.122462e-02 -0.0493444906  0.0052898107 -8.268463e-03 -0.0239951262
##  [39,] -3.387168e-02 -0.0568653801  0.0024982088 -1.490175e-02 -0.0296474192
##  [40,] -3.880821e-02 -0.0659391016 -0.0101403594 -9.213603e-03 -0.0304552409
##  [41,] -4.033747e-03  0.0106023432 -0.0498703937 -4.218557e-02  0.0064609210
##  [42,] -1.139886e-02 -0.0053518276 -0.0580780033 -1.003234e-02  0.0015576091
##  [43,] -1.410156e-02 -0.0085885360 -0.0507485231 -7.185632e-03  0.0020485974
##  [44,] -1.343581e-02 -0.0097978226 -0.0372385498 -9.476444e-03  0.0050593216
##  [45,] -1.101142e-02 -0.0086409497 -0.0366413956 -1.216779e-03  0.0080736513
##  [46,] -1.154630e-02 -0.0096787435 -0.0200913819 -9.414006e-03  0.0017666181
##  [47,] -1.103111e-02 -0.0099322264 -0.0220276839 -2.921070e-03  0.0013844206
##  [48,] -8.374558e-03 -0.0086544981 -0.0132468007 -6.620434e-03 -0.0019713959
##  [49,] -3.389580e-03 -0.0054354385 -0.0184585339  1.398569e-03 -0.0001419913
##  [50,]  1.980470e-04 -0.0034520764 -0.0126738132  7.465153e-04 -0.0010491194
##  [51,]  1.352837e-03 -0.0028163622 -0.0070199478  6.296384e-03 -0.0007104104
##  [52,]  1.918413e-03 -0.0027549449 -0.0070073697  1.771440e-02  0.0021422424
##  [53,]  1.547666e-03 -0.0031684408  0.0147512675  1.019017e-02 -0.0021060342
##  [54,]  3.709952e-03 -0.0017378358  0.0197370885  2.193941e-02  0.0001570571
##  [55,]  1.778950e-03 -0.0033932946  0.0308977768  2.088290e-02 -0.0032410957
##  [56,]  3.599677e-03 -0.0016699225  0.0331215164  3.363814e-02 -0.0025679873
##  [57,]  1.897395e-03 -0.0014673146  0.0525401251  3.231199e-02 -0.0088679932
##  [58,]  1.617523e-03 -0.0021277885  0.0669906278  3.433061e-02 -0.0123765500
##  [59,]  8.654862e-04 -0.0021011006  0.0690044213  3.429918e-02 -0.0125151574
##  [60,]  2.272095e-02  0.0038260694 -0.0390812163 -6.274839e-04  0.0002827883
##  [61,]  1.343117e-03  0.0145521729  0.0147740196 -4.060737e-02 -0.0029610703
##  [62,]  6.735215e-03  0.0492955091 -0.0477223824 -1.829711e-01  0.0289707463
##  [63,]  1.784171e-02  0.0288655705  0.0700633455  1.769569e-02 -0.0544261038
##  [64,]  1.258953e-02  0.0024898153 -0.0253460362  4.811838e-02 -0.0013547055
##  [65,]  3.906557e-02  0.0162757986 -0.0721523232  6.570389e-02  0.0002083976
##  [66,]  1.502419e-02  0.0045892500 -0.0159873613  3.562936e-02 -0.0076459098
##  [67,]  1.618207e-03 -0.0004813422  0.0150159980  2.854503e-02 -0.0078836992
##  [68,] -6.302498e-03 -0.0036249746  0.0380617945  2.099467e-02 -0.0124873566
##  [69,] -8.080945e-03 -0.0027564694  0.0576187350  6.388124e-03 -0.0180115283
##  [70,] -1.226493e-02 -0.0047437495  0.0641045773 -1.292371e-02 -0.0259590005
##  [71,] -5.641451e-03 -0.0115544528  0.0044005885 -1.227567e-02  0.0080664953
##  [72,]  1.795030e-02  0.0032433039 -0.0345522566 -4.688382e-03  0.0027318969
##  [73,]  6.794672e-03 -0.0016791379 -0.0132493309 -1.835267e-02 -0.0023504826
##  [74,]  1.087113e-04 -0.0046326462 -0.0122722602 -1.070402e-02  0.0071059986
##  [75,] -8.496419e-03 -0.0094311560 -0.0092142450 -8.635119e-03  0.0136460367
##  [76,] -1.551029e-02 -0.0145836380 -0.0022624876 -1.113963e-02  0.0183479352
##  [77,] -1.807057e-02 -0.0156273651  0.0015735210 -2.049868e-02  0.0210867430
##  [78,] -2.095104e-02 -0.0182132130  0.0026692311 -2.125261e-02  0.0178283770
##  [79,] -2.219621e-02 -0.0191027272  0.0011985681 -3.609338e-02  0.0132806740
##  [80,] -2.082640e-02 -0.0176523794 -0.0105371959 -3.926602e-02  0.0159115712
##  [81,] -2.285059e-02 -0.0366986738  0.0477962294  1.192227e-02 -0.0588140338
##  [82,] -2.895144e-03 -0.0086681776  0.0571283997  3.401167e-03 -0.0378104535
##  [83,]  3.717333e-03 -0.0004316863  0.0484845155 -1.644224e-03 -0.0266631505
##  [84,]  7.701521e-03  0.0017147658  0.0467376493  2.972885e-04 -0.0226231026
##  [85,]  9.035807e-03  0.0041327951  0.0422859126 -8.889334e-03 -0.0223246916
##  [86,]  1.089303e-02  0.0058640887  0.0236443619  6.323065e-03 -0.0173652300
##  [87,]  9.503551e-03  0.0055476991  0.0212036150  6.976922e-04 -0.0181363797
##  [88,]  8.524609e-03  0.0059596014  0.0223557640 -1.260320e-03 -0.0189604194
##  [89,]  1.208064e-02  0.0106967037  0.0059002219  7.482237e-03 -0.0082419020
##  [90,]  8.150705e-03  0.0081981706  0.0033306241 -1.669981e-03 -0.0061760614
##  [91,]  6.796187e-03  0.0062877337 -0.0035906679  3.660868e-03  0.0010509731
##  [92,]  5.126880e-03  0.0062586554 -0.0213480715  1.562684e-02  0.0123410473
##  [93,]  3.188059e-07  0.0006823543 -0.0159888294  1.725056e-03  0.0141883405
##  [94,] -4.641047e-04  0.0039704313 -0.0271031130  1.091764e-03  0.0225790778
##  [95,] -1.931504e-03  0.0046056438 -0.0401521175  1.373078e-02  0.0291619242
##  [96,] -4.636649e-03  0.0027209349 -0.0357908490  7.497775e-03  0.0278617871
##  [97,] -7.049548e-03  0.0012281060 -0.0423423763  2.390831e-03  0.0297032940
##  [98,] -1.060515e-02 -0.0025358773 -0.0404154906 -6.728492e-03  0.0276719704
##  [99,] -1.280547e-02 -0.0070244772 -0.0434603435 -4.771902e-03  0.0292378351
## [100,] -1.067062e-02 -0.0042532499 -0.0612236570 -6.060895e-03  0.0406050662
## [101,]  5.871410e-02  0.0980037156 -0.0924839201 -1.299026e-02 -0.0526930786
## [102,]  5.199860e-02  0.0832665982 -0.0720009354  6.577693e-03 -0.0381908724
## [103,]  3.449179e-02  0.0621740950 -0.0264135171 -2.468376e-02 -0.0289626130
## [104,]  3.123992e-02  0.0412718069 -0.0299680091 -1.586125e-02 -0.0178623610
## [105,]  1.313329e-02  0.0230875535 -0.0006669042  1.416928e-02 -0.0033174386
## [106,] -1.003644e-02 -0.0084404947  0.0181625410  1.235311e-02  0.0096775240
## [107,] -2.023191e-02 -0.0311791849  0.0312246451  1.589022e-02  0.0170854159
## [108,] -4.606003e-02 -0.0698007730  0.0431337940 -3.024473e-03  0.0283442971
## [109,] -4.529449e-02 -0.0867042989  0.0544460679 -1.152157e-02  0.0362750511
## [110,] -6.919936e-02 -0.1134659003  0.0756881182  1.929436e-02  0.0498101462
## [111,]  3.428151e-02  0.0561675621 -0.0443285026  9.610972e-03 -0.0233689433
## [112,]  2.708039e-02  0.0491517608 -0.0439397383  1.596932e-02 -0.0176241827
## [113,]  2.418284e-02  0.0416436314 -0.0164841896 -1.844071e-02 -0.0204916297
## [114,]  2.385431e-02  0.0400135129 -0.0347074542  3.237217e-03 -0.0078275121
## [115,]  2.354129e-02  0.0719686571  0.0414768797  7.583747e-03  0.0046940504
## [116,]  2.023171e-02  0.0667758499  0.0372944250 -4.032290e-04  0.0150830768
## [117,]  2.742434e-02  0.0641003593  0.0357688135 -2.057305e-02  0.0092286181
## [118,]  1.361431e-02  0.0528567053  0.0294008915  1.066259e-02  0.0132526542
## [119,]  1.024406e-03  0.0400059153  0.0283692750  2.220299e-03  0.0136267168
## [120,]  8.942614e-03  0.0433531558  0.0234663061 -6.330352e-03  0.0122390612
## [121,]  1.392268e-03  0.0413488948  0.0347730784 -5.080127e-03  0.0062479052
## [122,]  4.607955e-03  0.0476484815  0.0278783929  4.620784e-03  0.0119847823
## [123,]  7.320767e-03  0.0432693017  0.0170169223 -2.559166e-03  0.0068384371
## [124,]  4.123145e-03  0.0403539535  0.0246868985 -2.391991e-02  0.0022625726
## [125,]  1.452509e-02  0.0397578459  0.0129760713 -3.173122e-02 -0.0024863947
## [126,]  1.095313e-02  0.0401780795  0.0085968915  9.055095e-03  0.0050123559
## [127,] -7.513235e-03  0.0188212479  0.0089342193  1.024450e-03 -0.0002945833
## [128,] -8.268170e-04  0.0203225372 -0.0001695205  1.128591e-02  0.0042345498
## [129,] -1.182395e-02  0.0118834766  0.0005432153  2.781922e-02  0.0050342340
## [130,]  3.108070e-01 -0.1762280889 -0.0154431467 -8.190608e-03  0.0004941332
## [131,] -2.280076e-02 -0.0031480644 -0.0102020170  1.578140e-02 -0.0047150352
## [132,] -2.575646e-02 -0.0078479988 -0.0130461898 -4.445962e-03 -0.0061548152
## [133,] -1.941395e-02 -0.0141477560 -0.0304480301 -2.274107e-02 -0.0163796627
## [134,] -2.103229e-02 -0.0106278726 -0.0332395073  9.770679e-03 -0.0150050814
## [135,] -2.528069e-02 -0.0141343544 -0.0371028933  2.015445e-02 -0.0098675385
## [136,] -1.532778e-02 -0.0073376305 -0.0186328980  6.193421e-03 -0.0102587488
## [137,] -2.221066e-02 -0.0145489176 -0.0051371205 -2.143515e-02 -0.0071523403
## [138,] -1.319102e-02 -0.0187948381 -0.0311452013 -2.398091e-02 -0.0089313920
## [139,] -1.269457e-02 -0.0089884752 -0.0167104649 -1.068957e-03 -0.0019084947
## [140,] -2.441047e-02 -0.0165461742 -0.0304232909  3.010160e-02 -0.0017328468
## [141,] -2.668660e-02 -0.0168975257 -0.0307241900  2.663924e-02 -0.0048945436
## [142,] -3.259323e-02 -0.0288914927 -0.0130332957 -1.200409e-02 -0.0185036288
## [143,] -3.279056e-02 -0.0297316297 -0.0331997435  9.925195e-03 -0.0148492993
## [144,] -2.639252e-02 -0.0300718036 -0.0318883680  2.192046e-03 -0.0168423436
## [145,] -2.712787e-02 -0.0292411798 -0.0247772691 -4.577995e-03 -0.0088811470
## [146,] -1.984558e-02 -0.0324504294 -0.0255393105 -2.872351e-02 -0.0124748270
## [147,] -2.753860e-02 -0.0370132208 -0.0346749954  3.343749e-05 -0.0095010547
## [148,] -3.640521e-02 -0.0420127035 -0.0384288208  1.935640e-02 -0.0106590264
## [149,] -3.677546e-02 -0.0410726214 -0.0487737349  2.894007e-02 -0.0074599647
## [150,] -3.356392e-02 -0.0386688759 -0.0195311559 -7.467543e-03 -0.0156359765
## [151,] -3.042735e-02 -0.0334234495 -0.0326062573  1.029724e-02 -0.0127490594
## [152,] -1.811374e-02 -0.0238969451 -0.0224151374  1.675800e-03 -0.0130269339
## [153,] -2.237499e-02 -0.0288277728 -0.0235268953 -4.005094e-03 -0.0082738739
## [154,] -1.339574e-02 -0.0283971788 -0.0184174351 -2.609485e-02 -0.0126004458
## [155,] -1.376133e-02 -0.0225585488 -0.0126722906  7.338529e-04 -0.0039278722
## [156,] -2.229854e-02 -0.0286507019 -0.0110544583 -2.965539e-03 -0.0037616521
## [157,] -1.698003e-02 -0.0304205253 -0.0226895028 -8.550701e-03 -0.0047414145
## [158,] -2.081781e-02 -0.0284819042 -0.0174786694  6.166845e-03 -0.0067652183
## [159,] -1.022948e-02 -0.0119015715 -0.0166885929  2.181404e-02  0.0030027835
## [160,] -6.508384e-03 -0.0115616909 -0.0142506111  1.316349e-02 -0.0018268328
## [161,] -4.011850e-03 -0.0056429114  0.0009360049 -1.093189e-04 -0.0004751730
## [162,]  7.612431e-03 -0.0015867041  0.0032924198 -1.604366e-02 -0.0028011957
## [163,]  6.022214e-03  0.0034591488  0.0072895239  1.753335e-02  0.0047462663
## [164,]  9.169915e-03  0.0122519356  0.0171186897  2.357152e-02  0.0127958734
## [165,]  1.056052e-02  0.0070064794  0.0110112548  1.647487e-02  0.0125930613
## [166,]  4.318068e-03  0.0021248619  0.0217725650 -1.185105e-02  0.0076885575
## [167,]  1.924623e-02  0.0055225551  0.0114754867 -3.315562e-02  0.0061928310
## [168,]  1.490819e-02  0.0086485694  0.0205885721 -1.609926e-02  0.0028036757
## [169,]  1.580429e-02  0.0136869182  0.0375747512 -2.979757e-02  0.0052994112
## [170,]  2.443124e-02  0.0147523648  0.0241102662 -2.850647e-02  0.0041231560
## [171,]  2.299911e-02  0.0191204703  0.0304612586 -2.339815e-03  0.0081478996
## [172,]  2.008018e-02  0.0188013179  0.0330943774  5.656475e-03  0.0130651292
## [173,]  2.292982e-02  0.0172552028  0.0311138106  5.051899e-03  0.0143633106
## [174,]  1.702934e-02  0.0131996988  0.0482216915 -2.225494e-02  0.0116027188
## [175,]  2.357225e-02  0.0080628312  0.0248165157 -2.756644e-02  0.0101321036
## [176,]  1.639735e-02  0.0040449382  0.0281899497 -1.523587e-02  0.0083134571
## [177,]  8.188224e-03 -0.0023214206  0.0285593862 -2.041736e-02  0.0031334522
## [178,]  1.693045e-02  0.0003874730  0.0195861038 -2.090351e-02  0.0032648200
## [179,]  1.037075e-02 -0.0045314504  0.0054116216  1.401683e-02  0.0055566131
## [180,]  9.592496e-03 -0.0013524493  0.0047281138  3.218804e-02  0.0089380757
## [181,]  6.649690e-03 -0.0073240890  0.0219099843  1.305143e-02  0.0052447346
## [182,]  6.873101e-03 -0.0045218315  0.0169994682  2.564932e-02  0.0096504123
## [183,]  6.502332e-03 -0.0130357848 -0.0053428234  3.374656e-02  0.0107614318
## [184,] -3.263233e-03 -0.0255679871  0.0036094778 -4.193122e-03  0.0019613442
## [185,]  1.007182e-02 -0.0191305326  0.0032752519 -2.204819e-02 -0.0019417786
## [186,]  1.299571e-02 -0.0089329829  0.0061006537  7.592584e-03  0.0047992035
## [187,]  5.952533e-03 -0.0172370767 -0.0056483337  1.299159e-02  0.0055985440
## [188,]  9.444198e-03 -0.0183328036 -0.0126692781  1.654848e-02  0.0018020193
## [189,]  2.317311e-03 -0.0251598807  0.0135597767 -2.777334e-02 -0.0054017680
## [190,] -1.198358e-01  0.0768290820  0.0102679927 -2.468332e-02 -0.0035677951
## [191,]  1.583681e-02 -0.0148119655  0.0003740993  7.635402e-03  0.0071944342
## [192,]  1.078399e-02 -0.0152777436  0.0236493102 -1.415158e-02  0.0062563347
## [193,]  2.297262e-02 -0.0071876811  0.0212155078 -1.789118e-02  0.0081725705
## [194,]  1.557397e-02 -0.0124391777  0.0069847624  1.232557e-02  0.0094152145
## [195,]  1.451170e-02 -0.0107227179  0.0083160536  1.627699e-02  0.0095516985
## [196,]  1.815942e-02 -0.0101445142  0.0073678484  1.581965e-02  0.0078201713
## [197,]  1.100010e-02 -0.0175955879  0.0163026514 -7.273657e-03  0.0010632745
## [198,]  1.585465e-02 -0.0234325152 -0.0030885602 -6.531300e-03  0.0003235432
## [199,]  1.273190e-02 -0.0228702511 -0.0034451579  2.237816e-02  0.0071710555
## [200,] -2.073913e-01  0.1078276463  0.0080832597  3.350389e-02  0.0030462272
##                 PC26          PC27          PC28          PC29          PC30
##   [1,]  1.400450e-03  7.490022e-04 -6.027328e-03  6.365462e-04 -3.136025e-05
##   [2,]  1.498605e-04  3.049710e-03  3.546448e-03 -7.377730e-04  5.508214e-05
##   [3,]  1.588253e-04  1.810407e-03  3.082577e-03 -7.592008e-04  4.262744e-07
##   [4,] -2.881811e-04  7.449734e-04  4.571472e-04 -7.506397e-04 -5.122544e-05
##   [5,]  8.961038e-05  1.577647e-05 -8.376816e-07 -1.000396e-07 -4.319691e-09
##   [6,] -3.862558e-03  4.808769e-04 -1.046808e-03 -4.996198e-04 -4.596307e-05
##   [7,] -4.591528e-03 -1.406350e-04 -7.567600e-04 -2.121641e-04 -8.325860e-05
##   [8,] -5.049167e-03 -1.025039e-03 -4.626144e-04  3.737173e-05  6.737717e-05
##   [9,] -1.125186e-03 -2.421926e-03  3.977170e-04  8.190088e-04  5.600030e-05
##  [10,] -1.195946e-05 -3.769853e-03  7.375902e-04  1.175233e-03  2.318850e-05
##  [11,]  1.637993e-03  2.329285e-03 -2.127766e-03 -2.498855e-03 -1.532799e-04
##  [12,]  1.943439e-02  7.845435e-04 -1.631073e-03 -1.783291e-03 -9.449859e-05
##  [13,]  3.768485e-03 -9.206747e-04 -2.295725e-03 -1.206777e-03 -8.471845e-05
##  [14,] -3.983782e-03 -2.128923e-03 -2.733890e-03 -6.014110e-04 -8.502628e-05
##  [15,] -1.268248e-02 -2.419605e-03 -2.803555e-03 -1.790702e-04 -5.328785e-06
##  [16,] -6.333311e-03  3.115319e-04  4.758121e-04  6.665656e-04  1.285155e-05
##  [17,]  8.758836e-03  3.418708e-04  1.051484e-03  9.330438e-04  3.601507e-05
##  [18,] -2.446763e-02 -2.327523e-04  1.681553e-03  1.103559e-03  8.186883e-05
##  [19,]  9.230285e-03 -1.607619e-03  2.672070e-03  1.608196e-03  1.175364e-04
##  [20,]  1.809023e-02 -3.063722e-03  2.669939e-03  1.850150e-03  1.539271e-04
##  [21,] -1.220761e-02  3.619864e-03  9.876556e-05 -7.006806e-04  3.326318e-05
##  [22,]  1.225443e-02  2.194178e-03  7.175413e-04  2.427378e-05  4.899821e-05
##  [23,] -4.460320e-03  6.843156e-04  2.361122e-04  3.270445e-04 -1.327097e-05
##  [24,] -1.338561e-02  1.217239e-05  3.700400e-04  3.317059e-04 -1.718364e-05
##  [25,]  1.740894e-02  4.718563e-04  1.696038e-03  4.299180e-04 -2.140869e-05
##  [26,] -2.714720e-03  7.502320e-03 -4.146281e-03  5.372811e-04  7.696338e-05
##  [27,] -1.906064e-02  6.373522e-03 -3.761042e-03  2.833025e-04  6.916217e-05
##  [28,] -1.053897e-02  4.815769e-03 -2.676900e-03  6.431732e-04  9.310067e-05
##  [29,]  1.513598e-02  2.808945e-03 -2.247434e-03  9.653660e-04  1.805761e-05
##  [30,]  2.488345e-02  6.124945e-04 -2.268737e-03  1.134606e-03  3.432681e-05
##  [31,]  1.555043e-02  1.146481e-04 -2.300151e-03  8.790974e-04 -4.479600e-05
##  [32,] -1.895445e-02  1.320059e-04 -1.600514e-03  6.975285e-04 -1.787682e-05
##  [33,]  2.109296e-02  3.233238e-04  1.503184e-04  7.576733e-04 -1.831997e-05
##  [34,]  2.804280e-02  4.977578e-04  1.432603e-03  3.169362e-04 -1.005468e-04
##  [35,] -2.074055e-02 -1.209620e-03  1.202374e-03 -2.522672e-04 -5.135642e-05
##  [36,] -1.314225e-02 -2.007810e-03  1.844889e-03 -6.658464e-04 -2.147518e-05
##  [37,] -4.861626e-03 -3.093161e-03  2.963999e-03 -7.931750e-04 -7.697119e-05
##  [38,]  1.233083e-02 -5.032467e-03  3.252374e-03 -9.332699e-04 -2.334459e-05
##  [39,] -1.258601e-02 -5.717904e-03  3.214675e-03 -1.687401e-03  9.413863e-06
##  [40,] -1.354317e-02 -5.635849e-03  4.894692e-03 -1.921281e-03  5.363537e-05
##  [41,]  4.134492e-03 -7.967044e-03 -4.869469e-04 -2.619745e-03  3.296582e-04
##  [42,]  9.212521e-03 -4.996742e-03  4.103885e-04 -1.076211e-03  2.712932e-05
##  [43,]  2.546049e-02 -4.421155e-03  6.140017e-04 -7.062614e-04 -2.273303e-05
##  [44,] -2.348818e-02 -4.757479e-03  4.302472e-04 -5.396214e-04  4.728321e-06
##  [45,] -2.323484e-02 -4.364919e-03  6.484392e-04 -2.507063e-04  9.389294e-06
##  [46,] -5.245914e-03 -5.181026e-03  4.962401e-05  2.255230e-05 -6.206074e-05
##  [47,]  2.012399e-02 -4.842110e-03  6.145294e-04  6.414782e-04 -4.224082e-05
##  [48,]  2.082198e-02 -4.971074e-03  8.757159e-05  8.136045e-04 -9.745585e-05
##  [49,]  1.251237e-02 -3.909819e-03 -3.781791e-05  9.665789e-04 -6.899805e-05
##  [50,] -1.204244e-02 -3.214565e-03 -8.996725e-04  8.060501e-04 -1.227767e-04
##  [51,] -1.227921e-02 -2.349601e-03 -9.162912e-04  8.879598e-04 -8.087266e-05
##  [52,] -4.829682e-03 -7.330234e-04 -5.166878e-04  9.098730e-04 -4.516797e-05
##  [53,] -1.246027e-02 -5.411206e-04 -1.382168e-03  5.694128e-04 -9.164629e-06
##  [54,] -1.310796e-02  8.238098e-04 -1.209790e-03  3.835370e-04 -6.124455e-05
##  [55,]  1.223527e-02  1.474588e-03 -8.848446e-04  5.319178e-04 -1.738136e-05
##  [56,] -3.949781e-03  2.759610e-03 -8.676371e-04  5.364184e-04  4.155476e-05
##  [57,] -3.552474e-03  3.312546e-03 -1.507650e-03  2.535296e-04  1.000035e-04
##  [58,]  3.117207e-03  4.950684e-03 -1.981453e-03 -4.145750e-04  6.312318e-05
##  [59,]  1.115139e-02  6.985750e-03 -1.674958e-03 -6.690180e-04  1.104513e-04
##  [60,]  1.329956e-04 -1.872702e-05  8.922747e-07  2.058999e-07  5.817884e-09
##  [61,]  3.239160e-04  1.450544e-02  3.615865e-03 -6.018304e-04  4.312375e-05
##  [62,] -3.291133e-03  1.750730e-02  5.937414e-03 -4.523313e-04 -9.907165e-05
##  [63,] -6.456316e-04 -5.799775e-03 -3.026439e-03 -1.315671e-03  5.163891e-05
##  [64,]  1.935980e-03  5.033176e-03  2.689362e-03 -1.958213e-03 -5.208123e-05
##  [65,] -1.911138e-02  2.689913e-03  1.670694e-03  9.058134e-05  2.589818e-05
##  [66,]  9.672024e-03  2.163813e-03  1.050984e-03 -8.875666e-04 -6.377948e-06
##  [67,]  1.608108e-02  1.394903e-03  1.072985e-03 -1.163120e-03 -1.060931e-04
##  [68,]  1.625130e-02 -2.745737e-04  5.182184e-04 -1.056663e-03 -1.542041e-06
##  [69,] -2.398519e-02 -2.447996e-03 -7.453796e-04 -8.785324e-04 -4.654556e-05
##  [70,]  1.417752e-03 -3.852925e-03 -1.184667e-03 -2.637775e-04 -1.005336e-05
##  [71,]  1.405657e-03  1.821211e-03  2.173086e-03 -6.858321e-04  8.085093e-05
##  [72,] -1.384905e-02 -4.779800e-04  1.734182e-04  1.028927e-03  6.725179e-05
##  [73,]  6.564645e-03  2.096455e-04 -8.242776e-04  4.268378e-04  6.025363e-05
##  [74,] -1.360974e-02  1.793262e-03 -4.023916e-04  1.965529e-04 -2.706232e-05
##  [75,]  1.388561e-03  2.664282e-03  2.887501e-04  2.560961e-04  5.160338e-05
##  [76,]  9.309469e-04  2.526960e-03  8.021943e-04  5.114468e-04 -2.694242e-05
##  [77,] -1.442579e-02  1.914216e-03  6.106821e-04  7.135171e-04 -2.554404e-05
##  [78,]  1.087759e-02  8.552182e-04  6.513781e-04  1.434458e-03 -5.606034e-06
##  [79,]  2.007311e-02  9.613813e-05 -9.036204e-05  1.890183e-03 -2.929072e-06
##  [80,] -4.655320e-03  2.744084e-04 -4.359044e-04  2.371239e-03  2.194832e-05
##  [81,] -2.088168e-02  7.744618e-03  6.004684e-04  5.336735e-04  3.024811e-05
##  [82,]  1.546802e-02  5.107468e-03  1.444513e-03  1.319797e-04  2.022689e-05
##  [83,]  1.025968e-02  3.837727e-03  1.638824e-03  1.448002e-04 -6.182157e-05
##  [84,] -2.106853e-02  2.154616e-03  1.044011e-03  1.701292e-04 -6.545902e-06
##  [85,] -2.342564e-03  5.828970e-04  6.992993e-04  3.615163e-04  1.817107e-05
##  [86,] -1.887137e-03  8.271825e-05  1.002142e-03  8.584335e-04 -1.374842e-05
##  [87,] -1.336309e-03 -9.764062e-04  3.153465e-04  9.058705e-04  3.130218e-05
##  [88,]  1.496905e-02 -1.872142e-03 -4.355408e-04  7.623869e-04 -1.172945e-05
##  [89,] -2.960382e-03 -1.184845e-03 -5.726613e-04  3.532000e-04  1.230587e-05
##  [90,]  1.320747e-02 -1.443569e-03 -8.582572e-04  1.971074e-04 -4.951234e-05
##  [91,] -1.252628e-02 -1.292503e-03 -1.151564e-03 -1.096366e-04 -1.235928e-05
##  [92,]  1.912638e-02 -4.072785e-04 -1.428656e-04 -1.872382e-04 -1.110790e-05
##  [93,] -1.295850e-02 -1.509516e-03 -7.404293e-04 -3.564610e-04 -5.415774e-05
##  [94,] -1.978284e-02 -1.952897e-03 -4.039303e-04 -2.419563e-04 -4.066721e-05
##  [95,]  3.934460e-03 -1.858919e-03  2.279969e-04 -1.718781e-04 -2.822572e-05
##  [96,]  3.776012e-03 -3.003126e-03 -5.165747e-04 -3.620870e-04  6.691644e-06
##  [97,]  3.410598e-03 -3.243331e-03 -1.010063e-03 -5.618808e-04  3.575511e-05
##  [98,]  1.102102e-02 -3.947857e-03 -1.841109e-03 -8.188112e-04 -1.862162e-05
##  [99,]  9.384508e-03 -4.270220e-03 -2.273165e-03 -1.021793e-03  3.662486e-05
## [100,] -7.814576e-03 -3.696151e-03 -2.016220e-03 -1.249097e-03  6.853324e-05
## [101,] -2.647838e-02 -6.418643e-04  2.951150e-04  2.682706e-04  8.792043e-06
## [102,]  4.752992e-03  3.636464e-04  8.622057e-04  8.907138e-05  1.727191e-05
## [103,] -1.260597e-02 -1.546329e-03 -1.164416e-03 -1.809547e-04  1.133859e-05
## [104,]  2.781782e-02 -6.911577e-04 -8.943741e-05 -5.280568e-05  5.211382e-06
## [105,]  2.503727e-02 -1.733780e-04  8.003829e-04 -1.172693e-06  9.318078e-06
## [106,] -2.213499e-02 -7.222686e-05  3.637922e-04  6.710023e-05 -4.525036e-05
## [107,]  1.849882e-02  3.928121e-04  5.664202e-04 -1.234977e-05 -6.060521e-05
## [108,] -2.174239e-03  7.898957e-04 -5.956948e-04  1.501920e-05 -2.780397e-05
## [109,]  7.722572e-03  2.302172e-04 -8.556339e-04 -1.001554e-04  6.969367e-05
## [110,] -2.042298e-02  1.348593e-03 -1.826348e-04 -9.203048e-05  1.203385e-05
## [111,]  1.795404e-04 -6.784055e-05 -8.338870e-04  5.938854e-04 -1.074128e-05
## [112,]  1.483578e-03 -3.216769e-04  7.667223e-05  7.519079e-04 -4.269055e-05
## [113,]  4.783452e-03 -2.270191e-04  7.957971e-05 -8.480038e-04 -2.532729e-05
## [114,]  8.396669e-05 -5.274283e-04  1.445830e-03 -4.270099e-05  7.142288e-05
## [115,]  1.153239e-02 -3.063378e-03  1.397436e-03  4.217369e-04 -3.424884e-05
## [116,] -1.766337e-02 -3.184364e-03  1.142725e-03  4.061243e-04  3.504209e-05
## [117,]  9.911742e-05 -4.119010e-03  9.639717e-04  2.991731e-04 -2.891577e-06
## [118,] -1.288469e-02 -2.414470e-03  2.133967e-03  4.312028e-04 -9.282137e-06
## [119,] -1.165003e-02 -2.185665e-03  1.782692e-03  3.122176e-04 -4.767022e-05
## [120,]  5.354183e-03 -2.772835e-03  1.999874e-03  3.367458e-04 -6.083327e-06
## [121,]  1.271020e-02 -3.355094e-03  2.076092e-03  3.878234e-04  3.435490e-05
## [122,]  6.566033e-03 -3.578593e-03  2.004356e-03  7.128422e-04 -9.378522e-05
## [123,] -1.936095e-02 -3.005794e-03  1.351130e-03  4.664484e-04 -4.375568e-05
## [124,]  1.355555e-03 -4.039908e-03 -4.477257e-05  5.591629e-04  2.574967e-06
## [125,]  8.194402e-05 -3.509264e-03 -6.067137e-04  2.112200e-04 -4.357156e-05
## [126,] -1.373065e-02 -1.340393e-03  4.359297e-04  1.558461e-05 -7.724717e-07
## [127,] -2.144144e-02 -6.519735e-04 -3.509661e-04  6.757884e-05 -2.106476e-05
## [128,]  1.004102e-03  2.511890e-04  6.451267e-04 -2.262265e-04  9.772005e-06
## [129,] -1.026486e-02  1.222654e-03  1.091434e-03 -2.482897e-04 -1.640900e-05
## [130,]  3.235556e-04  3.773372e-05  1.321861e-04  7.917166e-05  4.583984e-06
## [131,]  1.740691e-02  4.976753e-04  7.881066e-04  4.764429e-04  1.830677e-05
## [132,] -1.023445e-02 -7.023956e-04 -2.764725e-04  8.336457e-04  8.519710e-05
## [133,] -2.567614e-03 -2.287717e-04 -1.263997e-03  7.981178e-04  4.981241e-05
## [134,]  2.577183e-02  1.352152e-03 -5.677935e-04  5.611178e-04  5.257923e-05
## [135,]  2.595462e-02  2.227591e-03 -5.602630e-04  6.356544e-04  6.954062e-06
## [136,] -7.232874e-03  1.278262e-03 -1.020462e-03  9.361267e-05  5.488716e-05
## [137,] -1.116307e-02  3.971383e-04 -1.708058e-03 -1.242552e-04  7.191011e-06
## [138,]  1.318473e-02  1.207495e-03 -1.370708e-03  5.792194e-06  5.937740e-05
## [139,] -2.224190e-02  1.022902e-03 -4.308488e-04 -2.330295e-04  1.199836e-05
## [140,]  6.942619e-03  2.476176e-03  9.692578e-04  3.707431e-04 -1.948015e-05
## [141,]  1.425828e-03  1.706716e-03  9.178529e-05  5.651531e-04  3.186131e-05
## [142,] -3.170306e-03  2.083642e-03 -1.090651e-03 -4.364219e-04 -2.467612e-05
## [143,]  8.286854e-03  2.392989e-03 -1.172286e-03  3.814401e-04  3.991252e-05
## [144,] -1.986180e-03  3.068870e-03 -1.902402e-03 -3.190324e-04 -2.424670e-05
## [145,]  9.643566e-03  2.519395e-03 -1.832063e-03 -2.568382e-04 -5.723286e-05
## [146,]  1.961244e-03  1.834633e-03 -1.902664e-03 -4.585912e-04  8.673214e-06
## [147,]  6.884935e-03  3.195820e-03 -9.113314e-04 -3.996105e-04 -3.356182e-05
## [148,]  4.731981e-03  3.784772e-03 -4.945855e-04 -9.870964e-05  3.084186e-05
## [149,] -1.764876e-02  3.487855e-03 -4.898597e-04  3.729288e-04  1.249405e-05
## [150,] -2.054919e-02  2.736959e-03 -1.415631e-03 -5.929532e-04 -5.597245e-05
## [151,]  8.313732e-03  2.298907e-03 -1.289268e-03  2.479663e-04 -9.433919e-06
## [152,]  7.068065e-03  1.972470e-03 -1.642767e-03 -4.385938e-04  1.518228e-05
## [153,]  1.027068e-02  1.875305e-03 -1.780722e-03 -1.380914e-04 -1.161270e-05
## [154,]  1.053007e-02  1.242345e-03 -2.070377e-03 -5.086790e-04 -5.390119e-05
## [155,] -1.736574e-02  1.998996e-03 -1.010403e-03 -8.117039e-04 -1.788133e-05
## [156,]  9.227272e-03  1.848457e-03 -8.982791e-04 -3.869977e-04 -5.124561e-05
## [157,] -1.620862e-02  2.220755e-03 -8.314350e-04 -4.784457e-04 -1.296536e-06
## [158,]  6.605624e-03  2.372505e-03 -1.634606e-04 -3.568675e-04 -5.583916e-05
## [159,] -7.434086e-03  1.696075e-03  6.378879e-05 -1.554852e-04 -1.932679e-05
## [160,] -8.741891e-03  1.786744e-03 -2.970807e-04 -4.654002e-04  2.894614e-05
## [161,] -3.934575e-03  7.553278e-05 -7.880073e-04 -1.689723e-04 -1.199405e-05
## [162,] -1.318373e-02  1.837263e-04 -1.507425e-03 -7.624350e-04  1.967696e-05
## [163,] -5.472675e-04  1.219139e-03  2.476555e-04 -7.502414e-04  5.796894e-05
## [164,]  9.817101e-03  7.062356e-04  5.969215e-04 -8.781774e-04 -8.127969e-06
## [165,] -2.410143e-02  1.050955e-03  7.566466e-04 -8.462883e-04  7.514692e-05
## [166,]  3.059308e-02 -3.092259e-04 -1.370471e-04 -6.678617e-04  1.256756e-05
## [167,] -1.021946e-02 -6.252341e-04 -6.170493e-04 -9.879450e-04 -1.761506e-05
## [168,]  2.898890e-02 -7.729663e-04  5.239276e-05 -6.605204e-04  2.869464e-05
## [169,] -1.763992e-03 -1.933907e-03 -5.100627e-04 -8.246809e-04 -3.738006e-06
## [170,]  1.236674e-02 -8.139241e-04 -5.661256e-04 -1.134655e-03  2.521961e-05
## [171,]  1.718694e-02 -3.024383e-06  1.936276e-04 -1.190503e-03 -1.204121e-05
## [172,]  1.004646e-02 -2.643454e-05  4.196419e-04 -1.097876e-03  5.132329e-05
## [173,]  8.394212e-03  3.069440e-04  1.076379e-03 -1.216916e-03  2.750948e-05
## [174,]  1.351655e-02 -1.573134e-03  2.339231e-04 -9.683640e-04  4.374789e-06
## [175,]  1.213253e-02 -5.722498e-04  1.271733e-04 -1.061093e-03  8.041901e-05
## [176,] -2.261565e-02 -5.777964e-04  4.226899e-04 -8.105409e-04  8.197443e-05
## [177,]  1.229351e-02 -1.141708e-03  1.518653e-04 -3.908686e-04  6.365336e-05
## [178,] -2.243615e-02 -6.580088e-04 -4.807110e-04 -5.882882e-04 -3.701991e-05
## [179,] -1.068682e-02  1.280776e-03  4.866657e-04 -4.530270e-04 -5.351819e-05
## [180,]  1.580323e-02  8.111983e-04  1.081860e-03  1.245630e-04 -6.721081e-05
## [181,]  3.406311e-03  1.315806e-03  7.062351e-04 -7.289147e-04 -1.083326e-05
## [182,]  1.647598e-02  2.784140e-04  9.120600e-04  2.842089e-05  6.762565e-05
## [183,]  2.211667e-02  1.700012e-03  1.856467e-03  2.260306e-04 -2.717547e-05
## [184,] -4.699980e-03 -4.803978e-05 -5.015517e-04  4.269156e-04 -2.133036e-05
## [185,]  4.310679e-03 -1.314971e-03 -3.998842e-04  5.233059e-04 -3.609443e-05
## [186,] -7.267159e-03 -8.345648e-04  7.325951e-04  5.037283e-04  1.812348e-05
## [187,] -2.302631e-02 -1.670670e-04  2.172520e-04  8.309028e-04  1.868616e-05
## [188,]  2.428848e-02  3.636690e-04  7.527820e-04  8.902491e-04 -1.902044e-05
## [189,]  1.337828e-02 -1.641883e-03 -1.536572e-03  5.597363e-04 -4.056520e-05
## [190,]  7.184638e-03 -3.449584e-04 -9.903914e-04 -5.872415e-04 -3.416442e-05
## [191,] -1.598808e-05 -4.096257e-04  7.820825e-04  6.165934e-04  1.404938e-05
## [192,] -1.332457e-02 -2.206605e-03  1.283635e-04  5.905053e-04  5.221709e-06
## [193,] -2.216379e-02 -2.630119e-03  4.051444e-04  5.250787e-04 -1.849718e-05
## [194,] -1.791828e-02 -1.034066e-03  1.284431e-03  7.952629e-04 -2.993541e-05
## [195,] -1.578168e-02 -1.706317e-03  8.809186e-04  1.078590e-03 -4.183324e-05
## [196,] -9.165868e-03 -1.665134e-03  1.285433e-03  1.214676e-03  3.203651e-05
## [197,]  1.175537e-02 -2.784033e-03 -3.090743e-04  1.275350e-03  1.049806e-05
## [198,]  1.775643e-02 -1.815387e-03  3.198055e-04  1.398999e-03  8.812983e-06
## [199,] -2.750274e-02 -6.304276e-04  9.278885e-04  1.271642e-03 -8.042398e-05
## [200,] -7.583857e-03  3.088056e-04  8.582182e-04  5.080593e-04  2.958143e-05
##                 PC31          PC32          PC33          PC34
##   [1,] -1.993650e-06 -6.784020e-16 -2.581006e-16 -1.219739e-16
##   [2,]  6.345898e-06 -1.226814e-17 -2.581006e-16 -1.095157e-17
##   [3,]  2.857439e-06  2.097765e-16 -2.581006e-16 -1.095157e-17
##   [4,] -1.880435e-06 -1.226814e-17 -2.581006e-16 -1.095157e-17
##   [5,]  1.791243e-08 -2.343127e-16 -2.581006e-16 -1.095157e-17
##   [6,] -3.836957e-06  2.097765e-16 -2.581006e-16 -1.095157e-17
##   [7,] -4.248764e-06 -1.226814e-17 -2.581006e-16 -1.095157e-17
##   [8,] -1.815340e-06 -1.226814e-17 -2.581006e-16 -1.095157e-17
##   [9,]  9.075181e-07  4.318211e-16 -2.581006e-16 -1.095157e-17
##  [10,]  5.444819e-07  4.318211e-16 -2.581006e-16 -1.095157e-17
##  [11,] -5.099401e-06  1.923183e-16 -2.349321e-16 -3.933604e-18
##  [12,] -4.683009e-06  1.924337e-16 -2.345982e-16 -3.862188e-18
##  [13,] -4.521294e-06  1.810007e-16 -2.338468e-16 -3.604036e-18
##  [14,] -4.649053e-06 -4.387094e-17 -2.337471e-16 -3.558880e-18
##  [15,] -2.843221e-06 -4.670381e-17 -2.336480e-16 -3.513776e-18
##  [16,]  2.144732e-06  1.782765e-16 -2.337570e-16 -3.561873e-18
##  [17,]  2.968132e-06  1.840962e-16 -2.339712e-16 -3.656789e-18
##  [18,]  6.371232e-06  1.783209e-16 -2.341062e-16 -3.637945e-18
##  [19,]  5.932704e-06  1.956194e-16 -2.350762e-16 -3.992344e-18
##  [20,]  5.641976e-06  1.871460e-16 -2.340911e-16 -3.708212e-18
##  [21,]  9.211416e-07  1.698806e-16 -2.334693e-16 -3.429554e-18
##  [22,]  6.901518e-07  1.843064e-16 -2.343352e-16 -3.737465e-18
##  [23,] -8.086181e-08 -3.775084e-17 -2.346790e-16 -3.811875e-18
##  [24,]  8.208901e-08  1.814609e-16 -2.345798e-16 -3.766770e-18
##  [25,]  2.265927e-07 -3.469422e-17 -2.344557e-16 -3.788940e-18
##  [26,]  1.904989e-06  1.873436e-16 -2.347990e-16 -3.863297e-18
##  [27,]  2.394076e-06  3.922623e-16 -2.335006e-16 -3.439145e-18
##  [28,]  3.051264e-06  1.788577e-16 -2.341577e-16 -3.653576e-18
##  [29,]  2.748282e-07  1.875674e-16 -2.344765e-16 -3.795259e-18
##  [30,] -1.154686e-06  1.962246e-16 -2.351342e-16 -4.009969e-18
##  [31,] -2.483867e-06  1.819714e-16 -2.339399e-16 -3.632304e-18
##  [32,]  4.331388e-08  1.761961e-16 -2.340749e-16 -3.613460e-18
##  [33,] -1.680578e-07  1.963786e-16 -2.351500e-16 -4.014678e-18
##  [34,] -1.013994e-06  1.936214e-16 -2.347121e-16 -1.149191e-16
##  [35,]  7.800327e-07  1.820835e-16 -2.346385e-16 -1.148070e-16
##  [36,]  8.634789e-07 -4.843443e-17 -2.336534e-16 -1.145228e-16
##  [37,] -8.084227e-08 -4.550467e-17 -2.337630e-16 -1.145710e-16
##  [38,] -1.854850e-06  1.937974e-16 -2.350729e-16 -1.149988e-16
##  [39,] -1.966026e-06  1.737815e-16 -2.336699e-16 -1.145278e-16
##  [40,] -5.897036e-07  1.852590e-16 -2.347705e-16 -1.148621e-16
##  [41,]  1.750362e-06  8.457862e-16 -2.338900e-16 -3.602165e-18
##  [42,]  1.171918e-06  4.046441e-16 -2.340001e-16 -3.650595e-18
##  [43,]  3.099052e-07  4.104812e-16 -2.342149e-16 -3.745792e-18
##  [44,]  2.873524e-06  1.826088e-16 -2.346889e-16 -3.799974e-18
##  [45,]  3.332087e-06  3.990003e-16 -2.341468e-16 -3.635356e-18
##  [46,] -1.098072e-07  4.048201e-16 -2.343609e-16 -3.730273e-18
##  [47,] -4.164495e-07  4.192573e-16 -2.352279e-16 -4.038517e-18
##  [48,] -2.770401e-06  4.193085e-16 -2.352339e-16 -4.040232e-18
##  [49,] -2.015141e-06  4.107654e-16 -2.345871e-16 -3.828848e-18
##  [50,] -2.705592e-06  1.744324e-16 -2.337323e-16 -3.524489e-18
##  [51,] -1.670373e-06  4.022385e-16 -2.342858e-16 -3.692485e-18
##  [52,] -3.946222e-07  4.051855e-16 -2.343960e-16 -3.740915e-18
##  [53,] -8.457979e-07 -4.171925e-17 -2.342974e-16 -3.696091e-18
##  [54,] -1.065951e-06 -4.737822e-17 -2.337558e-16 -3.531526e-18
##  [55,] -1.804185e-06 -2.724813e-17 -2.351697e-16 -4.005770e-18
##  [56,]  1.582002e-06  1.891082e-16 -2.349672e-16 -3.914459e-18
##  [57,]  2.960260e-06  1.891595e-16 -2.349731e-16 -3.916175e-18
##  [58,]  1.116930e-06 -4.135845e-17 -2.339881e-16 -3.632043e-18
##  [59,]  1.516604e-06 -3.841727e-17 -2.340987e-16 -3.680526e-18
##  [60,] -2.403936e-08 -2.604572e-16 -2.344430e-16 -3.755215e-18
##  [61,]  2.235671e-06 -3.834408e-17 -2.344496e-16 -3.757210e-18
##  [62,] -5.026908e-06  1.779950e-16 -2.342464e-16 -3.665619e-18
##  [63,]  4.179079e-06 -3.821846e-17 -2.344617e-16 -3.760869e-18
##  [64,]  1.651438e-06 -3.809161e-17 -1.231066e-16 -3.689785e-18
##  [65,] -3.631026e-06 -2.601899e-16 -1.237903e-16 -3.837553e-18
##  [66,] -2.908033e-06 -2.485902e-16 -1.242138e-16 -4.026004e-18
##  [67,] -8.994400e-07 -2.513592e-16 -2.347991e-16 -3.908206e-18
##  [68,]  2.835096e-06 -2.569950e-16 -2.342576e-16 -3.743868e-18
##  [69,]  4.251950e-06 -4.931441e-17 -2.337415e-16 -3.512309e-18
##  [70,]  2.726296e-06  1.928603e-16 -2.351555e-16 -3.986553e-18
##  [71,] -7.588799e-07 -2.539806e-16 -1.236969e-16 -3.869035e-18
##  [72,] -6.114356e-06 -4.846266e-16 -2.344118e-16 -3.730730e-18
##  [73,] -5.983345e-06 -2.595652e-16 -2.341836e-16 -3.706413e-18
##  [74,] -2.610068e-06 -2.652766e-16 -2.339809e-16 -3.614874e-18
##  [75,]  9.305150e-07 -2.594396e-16 -2.341957e-16 -3.710071e-18
##  [76,]  1.406917e-06 -2.536782e-16 -2.347492e-16 -3.878067e-18
##  [77,]  2.442610e-06 -4.871212e-16 -2.339990e-16 -3.620475e-18
##  [78,]  2.181575e-06 -4.727072e-16 -2.348659e-16 -3.928492e-18
##  [79,]  5.378099e-07 -2.477041e-16 -2.349771e-16 -3.977254e-18
##  [80,]  2.704498e-06 -4.726340e-16 -2.352168e-16 -4.005177e-18
##  [81,]  5.314147e-06  4.098330e-16 -2.350141e-16 -3.913638e-18
##  [82,]  1.505026e-07  4.157398e-16 -2.348906e-16 -3.936088e-18
##  [83,] -2.219537e-06  4.072082e-16 -2.342450e-16 -3.725036e-18
##  [84,] -8.350039e-07  3.957341e-16 -2.338335e-16 -3.540244e-18
##  [85,] -2.803645e-06  4.015712e-16 -2.340483e-16 -3.635441e-18
##  [86,] -1.323833e-06  1.852880e-16 -2.346018e-16 -3.803436e-18
##  [87,] -9.293805e-07  1.910667e-16 -2.351560e-16 -3.971712e-18
##  [88,] -2.748829e-06  4.189483e-16 -2.353708e-16 -4.066909e-18
##  [89,] -7.155347e-07  1.797892e-16 -2.340735e-16 -3.643089e-18
##  [90,] -3.197462e-06  1.913306e-16 -2.348363e-16 -3.904619e-18
##  [91,] -7.771885e-07  1.827292e-16 -2.345289e-16 -3.766314e-18
##  [92,] -7.192831e-07  1.886360e-16 -2.344055e-16 -3.788764e-18
##  [93,] -9.496971e-07  1.885823e-16 -2.350892e-16 -3.936532e-18
##  [94,]  1.269632e-06  1.857609e-16 -2.349911e-16 -3.891761e-18
##  [95,]  2.438528e-06  1.887718e-16 -2.347634e-16 -3.867496e-18
##  [96,]  2.339272e-06  1.888462e-16 -2.347695e-16 -3.869439e-18
##  [97,]  2.508152e-06  1.831872e-16 -2.342279e-16 -3.704874e-18
##  [98,] -2.204487e-07  1.861457e-16 -2.343391e-16 -3.753636e-18
##  [99,] -2.491943e-07 -3.012018e-17 -2.348933e-16 -3.921912e-18
## [100,]  7.262191e-07 -3.583160e-17 -2.346906e-16 -3.830374e-18
## [101,]  3.234111e-06  6.508864e-16  2.389697e-16  5.183586e-18
## [102,] -2.198372e-07  4.408982e-16  2.385024e-16  4.981833e-18
## [103,]  7.940606e-07  6.433838e-16  2.398616e-16  5.439449e-18
## [104,] -8.560336e-06  4.362797e-16  2.392892e-16  5.190877e-18
## [105,] -1.810026e-07  2.204707e-16  2.386912e-16  5.009298e-18
## [106,]  6.071593e-06  2.094010e-16  2.387200e-16  5.107762e-18
## [107,] -3.250112e-07 -3.395922e-18  1.276722e-16  5.025190e-18
## [108,]  2.892981e-06 -2.392839e-16  2.395046e-16  5.316141e-18
## [109,] -6.448176e-06 -4.578959e-16  2.393489e-16  5.253796e-18
## [110,]  2.741618e-06 -6.823461e-16  1.280409e-16  5.211906e-18
## [111,] -1.196394e-06 -9.843167e-18  1.281190e-16  5.175768e-18
## [112,]  3.619219e-06 -3.596217e-18  1.275200e-16  4.993857e-18
## [113,] -4.462268e-06 -2.279243e-16  1.279114e-16  5.097741e-18
## [114,]  4.212104e-06  3.181607e-18  1.268690e-16  4.796264e-18
## [115,]  1.169846e-07  2.200587e-16  2.383879e-16  4.946966e-18
## [116,]  4.934868e-06  4.253873e-16  2.393020e-16  5.284404e-18
## [117,] -7.371587e-06  4.374027e-16  2.384947e-16  5.009292e-18
## [118,]  1.204565e-06  2.186978e-16  2.380009e-16  4.874428e-18
## [119,]  3.709281e-06  4.298647e-16  2.390451e-16  5.191411e-18
## [120,] -2.748808e-06  2.141309e-16  2.387838e-16  5.082194e-18
## [121,]  1.404009e-06  4.453238e-16  2.380790e-16  4.853184e-18
## [122,]  4.018076e-06  4.372718e-16  2.386787e-16  5.050269e-18
## [123,]  1.145846e-06  4.291847e-16  2.389388e-16  5.174046e-18
## [124,]  1.193116e-06  6.575401e-16  2.386776e-16  5.064830e-18
## [125,] -9.104038e-06  2.139991e-16  2.386250e-16  5.048867e-18
## [126,]  6.324967e-08  2.116518e-16  2.386787e-16  5.080056e-18
## [127,]  3.639424e-06  4.370419e-16  2.381854e-16  4.945244e-18
## [128,] -1.065961e-06  2.184651e-16  2.383692e-16  4.956206e-18
## [129,]  4.568838e-06  2.161004e-16  2.384235e-16  4.987675e-18
## [130,] -1.874003e-05  8.941800e-16  2.372780e-16  4.639816e-18
## [131,]  3.738333e-06  2.315312e-16  2.374612e-16  4.650498e-18
## [132,]  7.163113e-06  6.703248e-16  2.372802e-16  4.655375e-18
## [133,] -4.495573e-06  2.296623e-16  2.371240e-16  4.592978e-18
## [134,]  3.096727e-07  4.523486e-16  2.377503e-16  4.723401e-18
## [135,]  4.326315e-06  4.528739e-16  2.377000e-16  4.708103e-18
## [136,]  2.270287e-07  2.312383e-16  2.369729e-16  4.547084e-18
## [137,]  1.521911e-07  6.817687e-18  2.370283e-16  4.578886e-18
## [138,] -1.037179e-05  2.323186e-16  2.372132e-16  4.590181e-18
## [139,] -2.216260e-06 -7.373359e-19  2.375813e-16  4.761723e-18
## [140,]  4.269946e-06  2.390681e-16  2.365660e-16  4.393637e-18
## [141,]  8.467314e-06  4.530552e-16  2.371672e-16  4.591107e-18
## [142,] -1.207322e-06  2.372520e-16  2.365697e-16  4.409581e-18
## [143,]  5.105419e-06  2.406500e-16  2.364153e-16  4.347796e-18
## [144,] -2.195066e-06  2.268594e-16  2.375663e-16  4.712211e-18
## [145,] -9.046945e-07  2.302346e-16  2.374141e-16  4.651092e-18
## [146,] -1.053616e-05  1.723430e-17  2.363743e-16  4.350332e-18
## [147,] -4.729600e-06  2.312510e-16  2.373166e-16  4.621494e-18
## [148,]  2.888890e-06  4.538095e-16  2.372674e-16  4.606529e-18
## [149,]  8.532213e-06  2.236262e-16  2.375314e-16  4.731584e-18
## [150,] -6.811891e-07  2.298676e-16  2.369339e-16  4.550058e-18
## [151,]  4.104380e-06  2.390342e-16  2.365713e-16  4.395072e-18
## [152,] -1.935822e-06  2.338206e-16  2.370702e-16  4.546668e-18
## [153,]  2.339847e-07  4.620838e-16  2.364749e-16  4.365807e-18
## [154,] -1.098031e-05  2.420724e-17  2.358792e-16  4.184894e-18
## [155,] -2.556467e-06  2.323915e-16  2.366919e-16  4.476562e-18
## [156,] -3.735380e-07  2.415466e-16  2.363304e-16  4.321909e-18
## [157,] -3.624699e-06  2.333965e-16  2.365955e-16  4.447297e-18
## [158,] -6.308855e-07  2.425516e-16  2.362340e-16  4.292644e-18
## [159,]  5.549440e-06  9.548120e-18  2.369410e-16  4.537213e-18
## [160,]  2.074027e-06  2.320952e-16  2.368928e-16  4.522580e-18
## [161,]  3.106293e-06  4.660627e-16  2.357494e-16  4.175386e-18
## [162,] -5.516800e-06  2.359204e-16  2.363535e-16  4.373801e-18
## [163,]  1.805124e-06  2.585704e-17  2.355495e-16  4.099686e-18
## [164,]  4.489856e-06  2.398450e-16  2.364935e-16  4.371461e-18
## [165,]  3.058560e-06  2.402312e-16  2.357687e-16  4.211107e-18
## [166,] -5.911280e-07  4.686517e-16  2.361901e-16  4.249326e-18
## [167,] -1.089818e-05  2.326829e-16  2.366650e-16  4.468301e-18
## [168,] -6.336012e-06  4.753555e-16  2.355472e-16  4.054113e-18
## [169,] -2.954654e-06  2.479810e-16  2.353694e-16  4.059988e-18
## [170,] -9.587222e-06  2.428316e-16  2.362082e-16  4.284715e-18
## [171,] -4.362484e-06  2.462127e-16  2.360564e-16  4.223648e-18
## [172,]  1.801774e-06  2.438023e-16  2.361151e-16  4.256447e-18
## [173,] -2.021754e-06  2.796489e-17  2.355209e-16  4.075919e-18
## [174,] -1.785386e-06  2.561935e-16  2.349268e-16  3.895618e-18
## [175,] -8.910474e-06  2.452700e-16  2.359754e-16  4.213932e-18
## [176,] -1.756025e-06  4.676835e-16  2.352511e-16  4.053858e-18
## [177,] -3.321963e-07  2.576726e-16  2.347860e-16  3.852770e-18
## [178,] -4.956194e-06  2.409109e-16  2.357045e-16  4.191538e-18
## [179,]  1.036727e-06  2.414603e-16  2.359968e-16  4.250317e-18
## [180,]  5.518673e-06  4.783473e-16  2.350899e-16  3.930049e-18
## [181,]  1.848335e-06  2.538924e-16  2.351485e-16  3.962848e-18
## [182,]  8.010950e-06  3.520603e-17  2.349990e-16  3.902446e-18
## [183,]  3.141599e-06  3.855835e-17  2.348490e-16  3.841992e-18
## [184,]  3.812764e-06  2.438298e-16  2.357685e-16  4.181092e-18
## [185,] -6.570156e-06  2.586199e-16  2.345227e-16  3.787797e-18
## [186,]  1.600829e-06  2.562268e-16  2.345808e-16  3.820316e-18
## [187,]  6.857300e-06  2.452164e-16  2.352916e-16  4.066163e-18
## [188,] -1.467050e-07  4.096251e-17  2.346194e-16  3.772206e-18
## [189,] -1.512335e-06  2.519966e-16  2.353303e-16  4.018053e-18
## [190,]  1.396702e-04 -4.022486e-16  3.452126e-16  1.146942e-16
## [191,] -9.265683e-07  3.372604e-17  2.347970e-16  3.870989e-18
## [192,]  1.870531e-06  2.561864e-16  2.344132e-16  3.784328e-18
## [193,] -3.801739e-06  3.172010e-17  2.344729e-16  3.817460e-18
## [194,]  2.647365e-06  2.514127e-16  2.348710e-16  3.923338e-18
## [195,]  6.469553e-06  2.461822e-16  2.353725e-16  4.075651e-18
## [196,]  4.372886e-06  2.609435e-16  2.341285e-16  3.682968e-18
## [197,]  3.555043e-06  2.557771e-16  2.349699e-16  3.908413e-18
## [198,] -3.622911e-06  4.278363e-17  2.342734e-16  3.682011e-18
## [199,]  4.005384e-06  2.311501e-17  2.352992e-16  4.068263e-18
## [200,] -1.209343e-04  7.040626e-16  2.343940e-16  1.147709e-16

5 Dimension Reduction

To keep 90% information of data, nased on th ecummulative proportion, the selected pca shall be PC1 to PC5.

summary(pca)
## Importance of components:
##                           PC1    PC2    PC3     PC4     PC5     PC6     PC7
## Standard deviation     4.3587 2.2053 2.1001 1.41814 1.16670 0.80858 0.65007
## Proportion of Variance 0.5588 0.1430 0.1297 0.05915 0.04003 0.01923 0.01243
## Cumulative Proportion  0.5588 0.7018 0.8315 0.89068 0.93072 0.94995 0.96238
##                            PC8     PC9    PC10    PC11   PC12    PC13    PC14
## Standard deviation     0.57845 0.50289 0.43500 0.35671 0.3350 0.27127 0.24478
## Proportion of Variance 0.00984 0.00744 0.00557 0.00374 0.0033 0.00216 0.00176
## Cumulative Proportion  0.97222 0.97965 0.98522 0.98896 0.9923 0.99443 0.99619
##                           PC15   PC16    PC17    PC18    PC19    PC20    PC21
## Standard deviation     0.20911 0.1934 0.13818 0.13666 0.06954 0.04145 0.03368
## Proportion of Variance 0.00129 0.0011 0.00056 0.00055 0.00014 0.00005 0.00003
## Cumulative Proportion  0.99748 0.9986 0.99914 0.99969 0.99983 0.99988 0.99991
##                           PC22    PC23    PC24    PC25    PC26     PC27
## Standard deviation     0.03240 0.02996 0.02312 0.01546 0.01364 0.003017
## Proportion of Variance 0.00003 0.00003 0.00002 0.00001 0.00001 0.000000
## Cumulative Proportion  0.99995 0.99997 0.99999 0.99999 1.00000 1.000000
##                            PC28      PC29      PC30      PC31      PC32
## Standard deviation     0.001506 0.0007818 5.366e-05 1.368e-05 4.211e-16
## Proportion of Variance 0.000000 0.0000000 0.000e+00 0.000e+00 0.000e+00
## Cumulative Proportion  1.000000 1.0000000 1.000e+00 1.000e+00 1.000e+00
##                             PC33      PC34
## Standard deviation     4.211e-16 4.211e-16
## Proportion of Variance 0.000e+00 0.000e+00
## Cumulative Proportion  1.000e+00 1.000e+00
pc_keep <- pca$x %>% as.data.frame() %>% select(c(PC1,PC2,PC3,PC4,PC5))
pc_keep
##           PC1          PC2          PC3          PC4           PC5
## 1   -4.856981  0.286039318 -3.167108725  1.086529787  0.9960426524
## 2   -4.568612  0.216107212 -4.421660395  0.398151859  0.5158896563
## 3   -4.374270  0.119649913 -4.847848921 -0.558824610  0.2037943658
## 4   -4.108053  0.044754039 -5.151540707 -1.270092145 -0.0785613337
## 5   -3.711520  2.385509601 -5.337098323 -2.041766339 -0.4463138432
## 6   -3.758451 -0.019436735 -5.474794022 -1.935408052 -0.5084295896
## 7   -3.709848 -0.012463956 -5.488350570 -1.865546151 -0.6428690365
## 8   -3.691217  0.002562939 -5.456567075 -1.708104358 -0.7657935159
## 9   -3.831441  0.154907762 -5.267703190  0.094574055 -0.2466408307
## 10  -3.861637  0.195145585 -5.183403590  0.560944097 -0.2565561770
## 11  -3.314913  0.143932909 -4.724686295  0.892225541 -0.2284598266
## 12  -3.408300  0.138919214 -4.559203702  0.855493334 -0.2316327497
## 13  -3.467702  0.108669687 -4.378559270  0.566613893 -0.2652835426
## 14  -3.483273  0.071911250 -4.287724474  0.182749281 -0.3122391268
## 15  -3.438707  0.042979891 -4.279759626 -0.117479582 -0.3520170696
## 16  -3.344062  0.033984010 -4.245073017 -0.180169865 -0.3030422774
## 17  -3.305345  0.052353972 -4.219058188  0.022344559 -0.2835774379
## 18  -3.316693  0.084450677 -4.143289107  0.370439115 -0.2450350582
## 19  -3.403649  0.113575356 -4.009979508  0.658421958 -0.2111449649
## 20  -3.472514  0.114527896 -3.791724709  0.716728124 -0.2049983667
## 21  -3.859052  0.099656192 -3.098183330  0.517453993 -0.1889106097
## 22  -3.927427  0.071502346 -2.983175229  0.166758776 -0.1652611453
## 23  -3.920517  0.043180003 -2.911819999 -0.139013401 -0.2053341434
## 24  -3.862111  0.031868285 -2.907430175 -0.246806260 -0.2230432443
## 25  -3.826230  0.046762559 -2.872960626 -0.095297660 -0.1450445691
## 26  -4.231474  0.088598680 -2.145676841  0.233104208  0.0139109614
## 27  -4.258687  0.109453236 -1.968015129  0.516019647  0.0433157050
## 28  -4.383042  0.119012336 -1.760896167  0.579030555  0.1158800202
## 29  -4.480434  0.104409061 -1.555827661  0.421518193  0.0936866913
## 30  -4.528685  0.078144699 -1.440110249  0.150492359 -0.0081324029
## 31  -4.490913  0.046391831 -1.337390106 -0.132299498 -0.0455306247
## 32  -4.468840  0.034402609 -1.287964686 -0.280223808 -0.0005006356
## 33  -4.460963  0.043250738 -1.263874041 -0.214277206 -0.0026628827
## 34  -4.438778  0.063648472 -1.186362691  0.035904266  0.0224924249
## 35  -4.474592  0.083982757 -1.007484573  0.299219613 -0.0154055567
## 36  -4.533340  0.092243780 -0.758695127  0.443328726 -0.0007958397
## 37  -4.623486  0.085848312 -0.548900240  0.384516190 -0.0093107270
## 38  -4.718987  0.069994114 -0.366780059  0.186193156 -0.0294316320
## 39  -4.708832  0.043432824 -0.199139147 -0.031976430 -0.0594060972
## 40  -4.741828  0.030860244 -0.123501358 -0.221792095 -0.0207508459
## 41  -4.429143  0.017941518 -0.473797432 -0.216550980 -0.0332604257
## 42  -4.414203  0.028131380 -0.465171965 -0.132032706  0.0300117766
## 43  -4.429832  0.046996483 -0.361009401  0.077129452  0.0486187519
## 44  -4.509206  0.066097829 -0.169342450  0.254362681  0.1345097786
## 45  -4.585047  0.071903879  0.051159130  0.322734691  0.2017111798
## 46  -4.676473  0.071361449  0.286904771  0.326503372  0.1977733664
## 47  -4.786548  0.067176698  0.476251959  0.234653551  0.2471534906
## 48  -4.857457  0.053453838  0.695137731  0.079092026  0.2917018802
## 49  -4.886236  0.034241003  0.873565024 -0.117970018  0.3234307810
## 50  -4.878609  0.018602102  1.051763335 -0.237745781  0.2986027244
## 51  -4.903928  0.017111554  1.212486356 -0.255806837  0.2860042159
## 52  -4.919056  0.021689488  1.359989436 -0.192838302  0.2836978121
## 53  -4.940566  0.026929962  1.573763875 -0.081525553  0.2248181216
## 54  -4.981071  0.031299883  1.807895559  0.007366967  0.2276838968
## 55  -5.077694  0.035971640  2.005037890  0.026762521  0.2267049950
## 56  -5.123709  0.028357934  2.229269749  0.018634188  0.0779345712
## 57  -5.136221  0.018337976  2.418900238  0.039845509 -0.1896330617
## 58  -5.132945  0.008106047  2.614215205  0.029704610 -0.2461611895
## 59  -5.157023  0.001610077  2.743930563  0.001577062 -0.3167240857
## 60  -4.933270  3.246328697  2.868845974 -0.347707465 -0.5719213934
## 61  -5.002309 -0.030519676  2.712537011 -0.155423786 -0.5311869361
## 62  -4.738995 -0.057040936  1.801562839 -0.377284499 -0.9567964354
## 63  -4.201769 -0.093075806  0.557876753 -0.563414042 -1.4021484046
## 64  -3.716412  0.013995849 -0.225828806 -1.856076040  6.6390386471
## 65  -4.457116  0.005046865  0.890463665 -0.789741958  1.7567321531
## 66  -4.237534  0.037681472  0.537951881  0.115925281  0.4788084353
## 67  -4.152236  0.066479364  0.444205244  0.742644064 -0.1048643829
## 68  -4.164992  0.068028083  0.505192405  0.985643631 -0.5192590326
## 69  -4.195870  0.039575963  0.593416652  0.847814651 -0.8460034790
## 70  -4.238823  0.001290017  0.566403475  0.453429793 -1.0020927084
## 71  -4.041191  0.027863406  0.199914369 -0.895211644  4.3246900823
## 72  -4.488515 -0.035718673  0.977319116 -0.820282310  1.1435573789
## 73  -4.239395 -0.059059762  0.673855156 -0.715784626  0.3280331726
## 74  -4.059799 -0.045247902  0.467636985 -0.402114059  0.0290497769
## 75  -3.968710 -0.012922980  0.351700065  0.056003158 -0.1789446389
## 76  -3.982340  0.019143791  0.358923389  0.446362724 -0.2566626717
## 77  -4.007046  0.028461318  0.427765476  0.632091160 -0.3636058010
## 78  -4.091471  0.015221940  0.528967874  0.495329263 -0.4415110511
## 79  -4.098252 -0.018273608  0.538810641  0.165373649 -0.5416203249
## 80  -4.058900 -0.051051868  0.490332464 -0.167017696 -0.6502918592
## 81  -4.193346 -0.086308900  2.537879353 -0.207673378 -0.0875457154
## 82  -4.360608 -0.048369881  3.018185039  0.068086341  0.3297141433
## 83  -4.473604 -0.028399450  3.292883021  0.251568029  0.4608307344
## 84  -4.588520 -0.028465282  3.572204568  0.248016473  0.5128461971
## 85  -4.676065 -0.040750399  3.741047394  0.113691358  0.4875350917
## 86  -4.736589 -0.060150180  3.859502844 -0.087701823  0.3797639458
## 87  -4.733657 -0.081277839  3.907621285 -0.270729132  0.2203196309
## 88  -4.696474 -0.098968475  3.960578446 -0.397568256  0.0670988662
## 89  -4.607533 -0.113417495  3.974046171 -0.466076519 -0.0131734354
## 90  -4.559522 -0.114581124  3.937940889 -0.464894383 -0.0810576921
## 91  -4.508957 -0.108099971  3.967608292 -0.344860407 -0.1425182674
## 92  -4.491039 -0.092501437  3.987005450 -0.160372087 -0.1244933051
## 93  -4.514015 -0.077219544  4.034064245  0.016017705 -0.1717280582
## 94  -4.522951 -0.072827522  4.073821388  0.142655518 -0.3687003415
## 95  -4.529593 -0.077917423  4.121713847  0.162080823 -0.4971838832
## 96  -4.531550 -0.091867503  4.190435221  0.085619352 -0.6310593910
## 97  -4.492019 -0.106886716  4.189340456  0.009532854 -0.7702387678
## 98  -4.462595 -0.122317517  4.205273670 -0.111857328 -0.8436532070
## 99  -4.460064 -0.130867918  4.258666838 -0.224841074 -0.7848737201
## 100 -4.424564 -0.135442016  4.243959697 -0.283660022 -0.7267018835
## 101  4.916351 -0.854079668  0.783361364 -2.251121951  0.8919800811
## 102  4.747088 -0.906941677  0.816633911 -2.332462321 -1.0882204634
## 103  5.052825 -0.888271370  0.598674418 -3.226951290  2.6766508758
## 104  4.605943 -0.972939763  0.901613600 -3.470080940 -0.4298838481
## 105  4.711115 -1.040549605  0.612615885 -3.917215189 -1.5569738538
## 106  4.970053 -1.060510357  0.279050941 -4.899678186  0.7445147806
## 107  4.726742 -1.136323772  0.402884534 -5.208787166 -1.5250084573
## 108  5.065794 -1.129340207  0.059255365 -6.473158259  2.6996708665
## 109  4.570992 -1.214522526  0.476815167 -6.610983173 -0.7681311342
## 110  4.693720 -1.278001293  0.146075480 -6.975473677 -1.9746163179
## 111  4.561367 -1.038844095 -0.178553186 -4.223363225 -2.6427413201
## 112  4.718175 -0.992941701 -0.293091695 -4.271292982 -0.9864303799
## 113  4.606146 -0.998597089 -0.293329925 -3.842051347 -2.7008995989
## 114  4.714785 -0.944870416 -0.291910367 -4.073685417 -0.3627327181
## 115  4.157154 -0.636610482  0.224724638  0.220098662 -1.0259159068
## 116  4.417509 -0.556757885  0.102148636 -0.085808982  3.0244798610
## 117  3.931124 -0.561678181  0.565014761  0.621810622  0.0112191256
## 118  4.014321 -0.548905917  0.340384797  1.086765345 -0.8676702907
## 119  4.265134 -0.500694742  0.128034117  0.917741123  1.7408540909
## 120  3.911598 -0.519048361  0.451668748  1.271280468 -0.3595761616
## 121  3.942642 -0.539970255  0.325531706  1.323199068 -1.1474350806
## 122  4.106280 -0.534691318  0.248053322  0.855777440  0.7432539396
## 123  3.934363 -0.575541330  0.370593455  0.885962278 -0.9600887755
## 124  4.217976 -0.550314110  0.194138882  0.144027919  2.4420173991
## 125  3.890037 -0.591746967  0.510590423  0.387046591 -0.2270501120
## 126  4.056084 -0.603714873  0.272195262  0.581053735 -1.0527176821
## 127  4.347986 -0.556382707 -0.035151311  0.421317164  1.2942634809
## 128  4.104976 -0.557123088  0.189657793  0.939995493 -0.6132629482
## 129  4.182210 -0.549093402  0.025145090  1.302820970 -1.2905033316
## 130  5.643394 17.763983425  0.476269875 -0.303535305 -0.0841317939
## 131  4.070640 -0.539919291  0.085836219  1.325616103 -1.1903380152
## 132  4.270573 -0.512445170 -0.020738020  0.606818532  2.1646078302
## 133  3.901872 -0.564553159  0.297392640  0.692205240 -0.4008301927
## 134  4.066006 -0.599873745  0.097877522  0.656040637 -1.2496214738
## 135  4.359243 -0.568611789 -0.146076544  0.278305573  1.2543381365
## 136  4.131306 -0.578602618  0.071568968  0.729401972 -0.8425088524
## 137  4.453952 -0.497961363 -0.143609824  0.307292587  3.5806691639
## 138  3.931272 -0.514222929  0.365558174  0.972507554  0.3316839589
## 139  4.005623 -0.525989716  0.245311192  1.265071038 -0.7213361380
## 140  4.071683 -0.542114144  0.022064625  1.302157552 -1.3139243471
## 141  4.268126 -0.545196108 -0.091229392  0.804829766  0.4012109071
## 142  4.168377 -0.590605484 -0.190481265  0.813669518 -1.3187556261
## 143  4.374987 -0.569196312 -0.266187655  0.343423012  0.9679411571
## 144  4.224085 -0.587993073 -0.090080265  0.696904090 -0.9015220886
## 145  4.483561 -0.518783293 -0.231401809  0.369587983  2.7356347877
## 146  4.026802 -0.522485074  0.165646859  0.967800034  0.1162069633
## 147  4.099801 -0.526212750  0.044261020  1.273111486 -0.7053515530
## 148  4.173682 -0.539524545 -0.108552805  1.371429129 -1.2953723626
## 149  4.315685 -0.534128941 -0.184986821  0.965005220  0.3391784074
## 150  4.191308 -0.576380621 -0.200435353  0.987631499 -1.2980346940
## 151  4.364419 -0.561644253 -0.233559555  0.478721774  0.8580014053
## 152  4.196928 -0.589732347 -0.035596191  0.699387592 -0.9690826797
## 153  4.456545 -0.531437441 -0.216503315  0.273026351  2.5222020419
## 154  4.065011 -0.542404182  0.151299073  0.826714123 -0.1072482904
## 155  4.158048 -0.542191244  0.034880503  1.174599560 -0.9135646298
## 156  4.343386 -0.503921608 -0.139269027  0.936301390  1.3637805242
## 157  4.069762 -0.528619360  0.094866091  1.179536192 -0.5115317308
## 158  4.127020 -0.550986395 -0.027289616  1.200637191 -1.2253105776
## 159  4.293720 -0.549092668 -0.058026273  0.782094245  0.3947387371
## 160  4.165024 -0.581016618  0.031761049  0.879571308 -1.1728377660
## 161  4.382380 -0.546498857 -0.081357705  0.330811295  1.8091704759
## 162  4.105452 -0.574013160  0.210631504  0.681491920 -0.5423827381
## 163  4.194322 -0.574265689  0.042147844  0.937688763 -1.2716265087
## 164  4.421453 -0.535807960 -0.048810985  0.791742170  0.8610904411
## 165  4.164636 -0.541716842  0.116817126  1.187741551 -0.9244098496
## 166  4.412331 -0.490505196  0.001761828  0.665790054  2.7944338924
## 167  3.958752 -0.528615466  0.448764925  0.965004959  0.0588174388
## 168  4.013026 -0.553982233  0.306137247  0.996790065 -0.8669574864
## 169  4.276838 -0.538179662  0.094216173  0.441153780  1.6915215485
## 170  4.058089 -0.573986953  0.311427322  0.629876310 -0.3571781906
## 171  4.181513 -0.584575241  0.143685226  0.793191635 -1.0751538069
## 172  4.402465 -0.551363868 -0.018043645  0.642354387  0.7653799350
## 173  4.198172 -0.553529360  0.121591308  1.033831143 -0.8059721585
## 174  4.399579 -0.500291193 -0.002029387  0.699283106  2.2470570703
## 175  4.042607 -0.525801679  0.338029781  1.059474981 -0.0788284244
## 176  4.088069 -0.542436465  0.193016202  1.158024480 -0.8981793832
## 177  4.286362 -0.529906990  0.010905743  0.717793802  1.0896918545
## 178  4.119190 -0.569816917  0.175185193  0.802801848 -0.6884279763
## 179  4.256928 -0.590072960 -0.033684511  0.842111808 -1.3272983981
## 180  4.418281 -0.567498573 -0.134745477  0.661921199  0.0644455360
## 181  4.352942 -0.577061298 -0.189444882  1.028033344 -1.4323724422
## 182  4.496677 -0.533166211 -0.178180592  0.872935813  0.6642154199
## 183  4.252941 -0.541375980 -0.025711003  1.236907353 -1.0454443313
## 184  4.504030 -0.497979750 -0.136814523  0.748101234  2.3120396446
## 185  4.054377 -0.533846556  0.261117636  1.009096080 -0.3518842639
## 186  4.145439 -0.562950471  0.115396378  1.016456901 -1.1957768409
## 187  4.411757 -0.546176555 -0.097580847  0.580129474  1.0515223282
## 188  4.200218 -0.572006491  0.054301779  0.815087146 -0.8971112163
## 189  4.550432 -0.518861109 -0.142103800  0.301373942  2.9430819336
## 190  5.401743 17.278781485  0.788839873 -0.626618791 -0.4579676967
## 191  4.179360 -0.545209642  0.125531631  1.092569351 -0.8619907023
## 192  4.414989 -0.507850853 -0.067608118  0.785284431  1.6598954466
## 193  4.118321 -0.535306411  0.215138521  1.058122219 -0.4439306924
## 194  4.218644 -0.558020484  0.032261489  1.103586868 -1.1727059927
## 195  4.426192 -0.548715152 -0.079397519  0.741645233  0.5384378107
## 196  4.242722 -0.571310918  0.013725282  0.909757490 -1.0961123068
## 197  4.539485 -0.533972166 -0.135575968  0.444707012  1.9878713667
## 198  4.187865 -0.552581984  0.130909387  0.854572422 -0.4479262393
## 199  4.317865 -0.559840896 -0.034241751  1.126836481 -1.2489203503
## 200  5.819809 17.221573360  0.307135960 -0.501276541  0.2862917021

As we know that PCA value reduce potential for munticollinearity. To prove that, below the correlation between variables from raw data.

6 Variables Correalation before and after PCA

ggcorr(Penicillin)
## Warning in cor(data, use = method[1], method = method[2]): the standard
## deviation is zero

Anf below is the correlation of each PC.

ggcorr(pca$x)

7 Visualizing PCA

To get better understanding of each PC, plotting PC using biplot are required like below.

biplot(pca,
       cex = 0.5, # 
       scale = F, # 
       choices = c(1,34)) # 

biplot(pca, scale = F, cex = 0.6)

The group of data and the arrow show the correaltion of data relative to other pc.

fviz_contrib(X = pca, axes = 1, choice = "var")

Contribution of each variables shown from figure above. The variable which have contribution below the red line categorized as less contributor variable.

Penicillin_pca <- PCA(X = Penicillin_clean, # 
                scale.unit = T, # 
                graph = F, # 
                ncp = 8)
Penicillin_pca$ind$coord %>% as.data.frame()
##         Dim.1        Dim.2        Dim.3        Dim.4         Dim.5        Dim.6
## 1   -4.869169  0.286757109 -3.175056312 -1.089256340  0.9985421360 -0.134147874
## 2   -4.580076  0.216649515 -4.432756173 -0.399150987  0.5171842371 -0.126768636
## 3   -4.385247  0.119950164 -4.860014182  0.560226933  0.2043057703 -0.061485742
## 4   -4.118362  0.044866346 -5.164468056  1.273279333 -0.0787584766 -0.067099112
## 5   -3.720834  2.391495833 -5.350491314  2.046889977 -0.4474338295  0.295940503
## 6   -3.767883 -0.019485510 -5.488532548  1.940264793 -0.5097054500  0.654374268
## 7   -3.719158 -0.012495233 -5.502123115  1.870227579 -0.6444822612  1.026296681
## 8   -3.700480  0.002569371 -5.470259862  1.712390700 -0.7677152091  1.404186670
## 9   -3.841055  0.155296490 -5.280922039 -0.094811380 -0.2472597547 -0.215601441
## 10  -3.871327  0.195635286 -5.196410897 -0.562351738 -0.2571999827 -0.229675629
## 11  -3.323231  0.144294097 -4.736542490 -0.894464504 -0.2290331269 -0.316883048
## 12  -3.416853  0.139267820 -4.570644632 -0.857640121 -0.2322140122 -0.277124593
## 13  -3.476404  0.108942384 -4.389546889 -0.568035762 -0.2659492489 -0.230722426
## 14  -3.492014  0.072091705 -4.298484151 -0.183207875 -0.3130226641 -0.201148390
## 15  -3.447336  0.043087745 -4.290499316  0.117774387 -0.3529004263 -0.203324733
## 16  -3.352454  0.034069290 -4.255725663  0.180621986 -0.3038027360 -0.217633296
## 17  -3.313639  0.052485350 -4.229645552 -0.022400631 -0.2842890511 -0.256792313
## 18  -3.325016  0.084662599 -4.153686336 -0.371368700 -0.2456499527 -0.286426868
## 19  -3.412191  0.113860363 -4.020042208 -0.660074212 -0.2116748151 -0.285671671
## 20  -3.481228  0.114815294 -3.801239717 -0.718526691 -0.2055127926 -0.263282163
## 21  -3.868736  0.099906271 -3.105957956 -0.518752499 -0.1893846647 -0.141443674
## 22  -3.937282  0.071681775 -2.990661251 -0.167177243 -0.1656758540 -0.108669414
## 23  -3.930355  0.043288359 -2.919126961  0.139362244 -0.2058494118 -0.100112892
## 24  -3.871803  0.031948256 -2.914726122  0.247425599 -0.2236029522 -0.123674412
## 25  -3.835831  0.046879906 -2.880170074  0.095536802 -0.1454085460 -0.168055865
## 26  -4.242092  0.088821011 -2.151061233 -0.233689163  0.0139458698 -0.183845845
## 27  -4.269374  0.109727899 -1.972953694 -0.517314554  0.0434244020 -0.196957404
## 28  -4.394041  0.119310988 -1.765314985 -0.580483583  0.1161708112 -0.175461248
## 29  -4.491677  0.104671067 -1.559731877 -0.422575957  0.0939217900 -0.139586892
## 30  -4.540049  0.078340797 -1.443724082 -0.150870007 -0.0081528104 -0.104276718
## 31  -4.502182  0.046508248 -1.340746172  0.132631492 -0.0456448799 -0.095091660
## 32  -4.480054  0.034488939 -1.291196723  0.280927006 -0.0005018919 -0.110237544
## 33  -4.472157  0.043359272 -1.267045625  0.214814916 -0.0026695650 -0.141494237
## 34  -4.449917  0.063808192 -1.189339767 -0.035994365  0.0225488677 -0.171516202
## 35  -4.485820  0.084193505 -1.010012769 -0.299970479 -0.0154442156 -0.175819327
## 36  -4.544716  0.092475258 -0.760599007 -0.444441222 -0.0007978368 -0.163061800
## 37  -4.635088  0.086063741 -0.550277658 -0.385481101 -0.0093340915 -0.128251104
## 38  -4.730829  0.070169758 -0.367700462 -0.186660391 -0.0295054882 -0.083377646
## 39  -4.720648  0.043541815 -0.199638870  0.032056673 -0.0595551717 -0.072293540
## 40  -4.753727  0.030937685 -0.123811274  0.222348663 -0.0208029184 -0.072323182
## 41  -4.440258  0.017986541 -0.474986386  0.217094396 -0.0333438898 -0.123717722
## 42  -4.425280  0.028201974 -0.466339274  0.132364031  0.0300870886 -0.160346236
## 43  -4.440949  0.047114417 -0.361915324 -0.077323001  0.0487407565 -0.182434860
## 44  -4.520521  0.066263696 -0.169767400 -0.255000982  0.1348473193 -0.186321335
## 45  -4.596553  0.072084316  0.051287509 -0.323544566  0.2022173567 -0.186102898
## 46  -4.688208  0.071540525  0.287624734 -0.327322704  0.1982696617 -0.167126356
## 47  -4.798560  0.067345272  0.477447073 -0.235242394  0.2477737011 -0.148711450
## 48  -4.869647  0.053587976  0.696882119 -0.079290501  0.2924338811 -0.133058641
## 49  -4.898498  0.034326928  0.875757160  0.118266053  0.3242424028 -0.137415103
## 50  -4.890851  0.018648782  1.054402645  0.238342383  0.2993520423 -0.148339192
## 51  -4.916234  0.017154494  1.215528987  0.256448762  0.2867219190 -0.160697453
## 52  -4.931400  0.021743916  1.363402213  0.193322214  0.2844097274 -0.175306077
## 53  -4.952964  0.026997540  1.577713100  0.081730135  0.2253822834 -0.176327588
## 54  -4.993570  0.031378427  1.812432318 -0.007385454  0.2282552500 -0.175715733
## 55  -5.090436  0.036061908  2.010069361 -0.026829680  0.2272738917 -0.156496414
## 56  -5.136566  0.028429096  2.234863910 -0.018680949  0.0781301413 -0.137071812
## 57  -5.149110  0.018383993  2.424970261 -0.039945497 -0.1901089296 -0.087970915
## 58  -5.145826  0.008126388  2.620775354 -0.029779151 -0.2467789099 -0.039407526
## 59  -5.169964  0.001614118  2.750816221 -0.001581019 -0.3175188777 -0.013431410
## 60  -4.945649  3.254475080  2.876045097  0.348580007 -0.5733565811  0.011309087
## 61  -5.014862 -0.030596262  2.719343890  0.155813808 -0.5325199042  0.060690598
## 62  -4.750887 -0.057184076  1.806083707  0.378231262 -0.9591974340  0.006941481
## 63  -4.212313 -0.093309372  0.559276697  0.564827881 -1.4056669758 -0.022920057
## 64  -3.725739  0.014030970 -0.226395504  1.860733703  6.6556987452  0.788200014
## 65  -4.468301  0.005059530  0.892698208  0.791723748  1.7611405218 -0.556377677
## 66  -4.248167  0.037776030  0.539301826 -0.116216185  0.4800099640 -0.454515873
## 67  -4.162656  0.066646188  0.445319939 -0.744507666 -0.1051275311 -0.316854950
## 68  -4.175444  0.068198794  0.506460142 -0.988117020 -0.5205620686 -0.175946127
## 69  -4.206399  0.039675275  0.594905780 -0.849942169 -0.8481264522 -0.035747790
## 70  -4.249460  0.001293254  0.567824816 -0.454567636 -1.0046073741  0.078294017
## 71  -4.051332  0.027933326  0.200416037  0.897458101  4.3355425211  0.655206958
## 72  -4.499779 -0.035808306  0.979771615  0.822340738  1.1464270380 -0.187585746
## 73  -4.250033 -0.059207967  0.675546137  0.717580826  0.3288563437 -0.139825116
## 74  -4.069987 -0.045361448  0.468810480  0.403123129  0.0291226748 -0.120541518
## 75  -3.978669 -0.012955409  0.352582626 -0.056143693 -0.1793936851 -0.116710075
## 76  -3.992334  0.019191831  0.359824076 -0.447482833 -0.2573067446 -0.093293252
## 77  -4.017101  0.028532740  0.428838917 -0.633677338 -0.3645182386 -0.057737852
## 78  -4.101738  0.015260138  0.530295273 -0.496572249 -0.4426189852  0.005466036
## 79  -4.108536 -0.018319464  0.540162740 -0.165788640 -0.5429794746  0.056420910
## 80  -4.069086 -0.051179978  0.491562911  0.167436812 -0.6519237109  0.076739595
## 81  -4.203869 -0.086525484  2.544247943  0.208194516 -0.0877654039  0.339373413
## 82  -4.371550 -0.048491261  3.025758916 -0.068257197  0.3305415327  0.250027431
## 83  -4.484830 -0.028470716  3.301146228 -0.252199317  0.4619871496  0.197979794
## 84  -4.600035 -0.028536713  3.581168709 -0.248638849  0.5141331407  0.200732583
## 85  -4.687799 -0.040852659  3.750435232 -0.113976656  0.4887585192  0.219283872
## 86  -4.748475 -0.060301121  3.869187936  0.087921903  0.3807169309  0.238673071
## 87  -4.745536 -0.081481798  3.917427125  0.271408504  0.2208725041  0.267099301
## 88  -4.708260 -0.099216828  3.970517178  0.398565919  0.0672672450  0.281139216
## 89  -4.619096 -0.113702107  3.984018699  0.467246098 -0.0132064931  0.271566558
## 90  -4.570964 -0.114868656  3.947822814  0.466060996 -0.0812610994  0.261955232
## 91  -4.520272 -0.108371239  3.977564665  0.345725804 -0.1428759048  0.238088812
## 92  -4.502309 -0.092733562  3.997010499  0.160774527 -0.1248057104  0.220375519
## 93  -4.525342 -0.077413319  4.044187383 -0.016057900 -0.1721589951  0.222251788
## 94  -4.534301 -0.073010277  4.084044294 -0.143013500 -0.3696255633  0.233193539
## 95  -4.540960 -0.078112950  4.132056934 -0.162487551 -0.4984315235  0.278668305
## 96  -4.542922 -0.092098037  4.200950759 -0.085834206 -0.6326429804  0.333745493
## 97  -4.503291 -0.107154939  4.199853246 -0.009556775 -0.7721716159  0.366898002
## 98  -4.473794 -0.122624463  4.215826443  0.112138024 -0.8457702823  0.398448129
## 99  -4.471257 -0.131196319  4.269353597  0.225405293 -0.7868432934  0.410029199
## 100 -4.435667 -0.135781896  4.254609550  0.284371842 -0.7285254795  0.391945856
## 101  4.928688 -0.856222907  0.785327143  2.256770948  0.8942184286 -2.981887804
## 102  4.759000 -0.909217569  0.818683183  2.338315435 -1.0909512593 -3.361394424
## 103  5.065505 -0.890500411  0.600176740  3.235049048  2.6833677016 -2.794846657
## 104  4.617501 -0.975381272  0.903876122  3.478788810 -0.4309626048 -3.054294456
## 105  4.722937 -1.043160775  0.614153192  3.927045104 -1.5608809462 -2.549383729
## 106  4.982524 -1.063171617  0.279751195  4.911973508  0.7463830766 -1.702550870
## 107  4.738603 -1.139175279  0.403895538  5.221858170 -1.5288353352 -1.700806631
## 108  5.078506 -1.132174189  0.059404061  6.489402094  2.7064454590 -0.683103225
## 109  4.582463 -1.217570267  0.478011694  6.627572868 -0.7700586934 -1.034528214
## 110  4.705498 -1.281208327  0.146442044  6.992978030 -1.9795714482 -0.533293568
## 111  4.572813 -1.041450985 -0.179001250  4.233961393 -2.6493730528  3.255820438
## 112  4.730015 -0.995433403 -0.293827183  4.282011426 -0.9889057423  3.946895311
## 113  4.617705 -1.001102983 -0.294066012  3.851692645 -2.7076772748  4.089538802
## 114  4.726616 -0.947241488 -0.292642891  4.083907981 -0.3636429647  4.788354115
## 115  4.167586 -0.638208002  0.225288565 -0.220650981 -1.0284903548 -0.018691357
## 116  4.428594 -0.558155022  0.102404969  0.086024313  3.0320695339  0.498567235
## 117  3.940988 -0.563087664  0.566432617 -0.623371003  0.0112472790 -0.216914886
## 118  4.024394 -0.550283350  0.341238964 -1.089492489 -0.8698476349 -0.155505759
## 119  4.275837 -0.501951192  0.128355407 -0.920044115  1.7452226149  0.297089034
## 120  3.921414 -0.520350868  0.452802172 -1.274470638 -0.3604784872 -0.125393936
## 121  3.952535 -0.541325264  0.326348599 -1.326519522 -1.1503144705 -0.015482109
## 122  4.116585 -0.536033080  0.248675791 -0.857924940  0.7451190716  0.337709776
## 123  3.944236 -0.576985601  0.371523428 -0.888185525 -0.9624980360  0.028742654
## 124  4.228561 -0.551695076  0.194626057 -0.144389345  2.4481454323  0.517130781
## 125  3.899799 -0.593231905  0.511871706 -0.388017851 -0.2276198748 -0.115929929
## 126  4.066263 -0.605229844  0.272878312 -0.582511839 -1.0553593869 -0.076468904
## 127  4.358897 -0.557778901 -0.035239520 -0.422374423  1.2975113241  0.303781397
## 128  4.115277 -0.558521140  0.190133723 -0.942354331 -0.6148018790 -0.128971629
## 129  4.192704 -0.550471305  0.025208189 -1.306090287 -1.2937417390 -0.062544600
## 130  5.657555 17.808560618  0.477465033  0.304297001 -0.0843429154  0.161294839
## 131  4.080855 -0.541274173  0.086051618 -1.328942623 -1.1933250664 -0.014398907
## 132  4.281290 -0.513731107 -0.020790061 -0.608341291  2.1700397279  0.474867466
## 133  3.911663 -0.565969857  0.298138921 -0.693942269 -0.4018360417 -0.111883212
## 134  4.076209 -0.601379076  0.098123137 -0.657686915 -1.2527572917 -0.055478495
## 135  4.370182 -0.570038671 -0.146443111 -0.279003957  1.2574857905  0.333725527
## 136  4.141673 -0.580054572  0.071748564 -0.731232344 -0.8446230561 -0.108988458
## 137  4.465129 -0.499210955 -0.143970201 -0.308063711  3.5896545461  0.479321310
## 138  3.941137 -0.515513327  0.366475511 -0.974947978  0.3325162914 -0.309259662
## 139  4.015675 -0.527309642  0.245926779 -1.268245625 -0.7231462692 -0.212665855
## 140  4.081901 -0.543474533  0.022119995 -1.305425204 -1.3172215276 -0.058421523
## 141  4.278836 -0.546564230 -0.091458324 -0.806849418  0.4022177115  0.287664530
## 142  4.178837 -0.592087558 -0.190959261 -0.815711351 -1.3220649303  0.056234171
## 143  4.385965 -0.570624662 -0.266855630 -0.344284803  0.9703701224  0.353858783
## 144  4.234685 -0.589468591 -0.090306313 -0.698652911 -0.9037843810 -0.071911290
## 145  4.494812 -0.520085135 -0.231982492 -0.370515432  2.7424996286  0.395845898
## 146  4.036907 -0.523796205  0.166062536 -0.970228645  0.1164985747 -0.253640963
## 147  4.110089 -0.527533235  0.044372089 -1.276306251 -0.7071215722 -0.198662142
## 148  4.184155 -0.540878436 -0.108825209 -1.374870612 -1.2986229885 -0.070580297
## 149  4.326515 -0.535469292 -0.185451029 -0.967426818  0.3400295465  0.245169107
## 150  4.201826 -0.577826999 -0.200938328 -0.990109875 -1.3012920007  0.041156264
## 151  4.375371 -0.563053651 -0.234145653 -0.479923085  0.8601544862  0.341735167
## 152  4.207460 -0.591212230 -0.035685517 -0.701142645 -0.9715145095 -0.046079084
## 153  4.467728 -0.532771038 -0.217046612 -0.273711487  2.5285312916  0.406591475
## 154  4.075212 -0.543765298  0.151678745 -0.828788691 -0.1075174208 -0.222980219
## 155  4.168482 -0.543551827  0.034968032 -1.177547117 -0.9158571419 -0.169731703
## 156  4.354285 -0.505186156 -0.139618511 -0.938650958  1.3672028144  0.240108460
## 157  4.079975 -0.529945885  0.095104150 -1.182496136 -0.5128153758 -0.131392477
## 158  4.137376 -0.552369048 -0.027358097 -1.203650087 -1.2283853894 -0.040071793
## 159  4.304495 -0.550470569 -0.058171885 -0.784056843  0.3957293001  0.261161212
## 160  4.175476 -0.582474629  0.031840751 -0.881778517 -1.1757809018 -0.010018319
## 161  4.393378 -0.547870249 -0.081561865 -0.331641437  1.8137104340  0.411339781
## 162  4.115755 -0.575453597  0.211160066 -0.683202066 -0.5437438010 -0.139854124
## 163  4.204848 -0.575706760  0.042253610 -0.940041812 -1.2748175464 -0.092127927
## 164  4.432548 -0.537152525 -0.048933472 -0.793728979  0.8632512738  0.253613410
## 165  4.175087 -0.543076234  0.117110268 -1.190722087 -0.9267295768 -0.105874339
## 166  4.423403 -0.491736077  0.001766249 -0.667460797  2.8014462846  0.426730508
## 167  3.968686 -0.529941981  0.449891062 -0.967426556  0.0589650361 -0.221993611
## 168  4.023096 -0.555372404  0.306905472 -0.999291424 -0.8691330418 -0.142217766
## 169  4.287570 -0.539530178  0.094452601 -0.442260818  1.6957662767  0.320455517
## 170  4.068272 -0.575427324  0.312208823 -0.631456930 -0.3580744986 -0.135513418
## 171  4.192006 -0.586042183  0.144045791 -0.795182082 -1.0778518132 -0.088896565
## 172  4.413512 -0.552747469 -0.018088924 -0.643966321  0.7673005903  0.221395473
## 173  4.208707 -0.554918395  0.121896431 -1.036425454 -0.8079946766 -0.102728819
## 174  4.410619 -0.501546631 -0.002034479 -0.701037897  2.2526958673  0.346828785
## 175  4.052751 -0.527121133  0.338878038 -1.062133643 -0.0790262375 -0.200285661
## 176  4.098328 -0.543797662  0.193500559 -1.160930443 -0.9004332873 -0.122771688
## 177  4.297118 -0.531236746  0.010933110 -0.719595044  1.0924263428  0.258816223
## 178  4.129527 -0.571246824  0.175624805 -0.804816410 -0.6901555273 -0.085208469
## 179  4.267611 -0.591553698 -0.033769039 -0.844225015 -1.3306291396 -0.029231745
## 180  4.429369 -0.568922662 -0.135083609 -0.663582234  0.0646072566  0.209899224
## 181  4.363866 -0.578509384 -0.189920278 -1.030613106 -1.4359668580 -0.014641814
## 182  4.507961 -0.534504146 -0.178627721 -0.875126371  0.6658822115  0.268429030
## 183  4.263613 -0.542734517 -0.025775522 -1.240011266 -1.0480677842 -0.091677309
## 184  4.515333 -0.499229387 -0.137157847 -0.749978530  2.3178415098  0.389876230
## 185  4.064551 -0.535186198  0.261772888 -1.011628320 -0.3527672873 -0.191651856
## 186  4.155841 -0.564363147  0.115685956 -1.019007613 -1.1987775403 -0.108475203
## 187  4.422828 -0.547547138 -0.097825718 -0.581585260  1.0541610333  0.274330614
## 188  4.210759 -0.573441892  0.054438045 -0.817132538 -0.8993624400 -0.111004897
## 189  4.561851 -0.520163146 -0.142460397 -0.302130214  2.9504673453  0.428421960
## 190  5.415298 17.322141105  0.790819399  0.628191237 -0.4591169273 -0.365370091
## 191  4.189848 -0.546577799  0.125846642 -1.095311060 -0.8641537941 -0.213440335
## 192  4.426068 -0.509125262 -0.067777775 -0.787255035  1.6640608119  0.248919868
## 193  4.128656 -0.536649717  0.215678393 -1.060777486 -0.4450446984 -0.174491622
## 194  4.229230 -0.559420789  0.032342447 -1.106356224 -1.1756487978 -0.096456051
## 195  4.437299 -0.550092105 -0.079596760 -0.743506328  0.5397889742  0.223084354
## 196  4.253369 -0.572744573  0.013759724 -0.912040448 -1.0988629067 -0.069708631
## 197  4.550876 -0.535312123 -0.135916184 -0.445822966  1.9928597594  0.365723327
## 198  4.198374 -0.553968641  0.131237893 -0.856716898 -0.4490502717 -0.202261618
## 199  4.328700 -0.561245768 -0.034327678 -1.129664180 -1.2520544088 -0.146155613
## 200  5.834413 17.264789421  0.307906691  0.502534452  0.2870101265  0.121819559
##            Dim.7        Dim.8
## 1   -0.512341670 -0.159510911
## 2   -1.233521086  1.216673431
## 3   -1.783884324  1.869661449
## 4   -1.678513687  1.824872445
## 5   -1.317326271  1.625845794
## 6   -0.663105708  0.835353941
## 7   -0.259803353  0.341366042
## 8    0.101704073 -0.154666381
## 9   -0.272735514 -0.156373108
## 10  -0.139337480 -0.482507410
## 11   0.240873561 -0.837703939
## 12  -0.101605233 -0.540215753
## 13  -0.489617282 -0.131702082
## 14  -0.738075758  0.204107470
## 15  -0.729341046  0.312986504
## 16  -0.497077513  0.150665233
## 17  -0.152018196 -0.199635525
## 18   0.106654892 -0.524513935
## 19   0.119111770 -0.627922594
## 20  -0.078573865 -0.479621377
## 21  -0.350838125 -0.589515498
## 22  -0.605303915 -0.215573052
## 23  -0.667197578 -0.056739996
## 24  -0.479991281 -0.152077212
## 25  -0.118399831 -0.421023629
## 26   0.964517740 -1.089149462
## 27   1.041118178 -1.214769275
## 28   0.868998342 -1.031346612
## 29   0.558851977 -0.704604959
## 30   0.262074803 -0.410525139
## 31   0.185879976 -0.258607464
## 32   0.327476139 -0.269103620
## 33   0.575054602 -0.454977639
## 34   0.835557174 -0.751492548
## 35   0.897243896 -0.951122433
## 36   0.811775864 -0.951175450
## 37   0.550027750 -0.741882121
## 38   0.248345633 -0.472351813
## 39   0.135310824 -0.289330962
## 40   0.144704203 -0.161650556
## 41   0.459549541  0.016713531
## 42   0.721620486 -0.094176109
## 43   0.900691572 -0.281298076
## 44   0.955464179 -0.322891591
## 45   0.904299814 -0.189311679
## 46   0.729477497 -0.006881108
## 47   0.549137208  0.275488125
## 48   0.405564224  0.534730004
## 49   0.366462868  0.773913189
## 50   0.411963139  0.836234050
## 51   0.511193185  0.794347345
## 52   0.632585659  0.694860606
## 53   0.674189441  0.561604947
## 54   0.683569181  0.522762117
## 55   0.568905722  0.600262917
## 56   0.398206730  0.646125779
## 57   0.108462823  0.538869962
## 58  -0.099494142  0.459869967
## 59  -0.250390211  0.479608418
## 60  -0.596434967  0.775977731
## 61  -0.622164872  0.513051202
## 62  -0.671262330  0.663249530
## 63  -0.658061077  0.504336247
## 64   0.119938322  0.420283049
## 65   2.781720112  1.867213266
## 66   2.259971721  0.306351957
## 67   1.629515194 -0.556675229
## 68   0.818855906 -0.779968185
## 69  -0.063286732 -0.616876940
## 70  -0.773739671 -0.262495298
## 71  -0.757170575  0.403545290
## 72   0.711794108  1.848678669
## 73   0.507448622  0.975090088
## 74   0.640040807  0.144748905
## 75   0.777868669 -0.523576648
## 76   0.731699724 -0.875282135
## 77   0.476388102 -0.898556411
## 78   0.031594634 -0.623294219
## 79  -0.351552876 -0.301228903
## 80  -0.510757362 -0.128811441
## 81  -0.612740380 -0.828218053
## 82  -0.077875164 -0.789001545
## 83   0.077063888 -0.577255220
## 84  -0.072560389 -0.259323635
## 85  -0.329290927  0.104244148
## 86  -0.574836953  0.403379598
## 87  -0.782152590  0.498465803
## 88  -0.851856054  0.447494133
## 89  -0.759419555  0.307705299
## 90  -0.639308128  0.131190193
## 91  -0.446311897 -0.107640662
## 92  -0.288598597 -0.310311059
## 93  -0.288970135 -0.418709183
## 94  -0.439696786 -0.461335460
## 95  -0.719453307 -0.470109729
## 96  -1.037286884 -0.441940996
## 97  -1.247475297 -0.435638913
## 98  -1.397573959 -0.433764741
## 99  -1.390421467 -0.426948967
## 100 -1.255156483 -0.446782048
## 101 -0.887407498 -1.333803240
## 102 -0.343578576 -0.967500126
## 103 -0.610968525 -1.015622968
## 104  0.323247868  0.053429062
## 105 -0.239825426 -0.481512107
## 106 -0.526441664 -0.768807994
## 107 -0.030910375 -0.222885733
## 108 -0.100729955 -0.341771773
## 109  0.995804236  0.825292330
## 110  0.429118087  0.212034824
## 111  0.404307704  0.364232503
## 112  0.474232268 -0.353884958
## 113  0.846421611 -0.714058242
## 114  1.138264423 -1.130184410
## 115  0.066934856  0.151703040
## 116  0.114820366 -0.161841113
## 117  1.145994255  0.673654578
## 118  0.682638054 -0.081279629
## 119  0.274597109 -0.518238543
## 120  0.578865365  0.205349088
## 121 -0.229603761 -0.049062318
## 122 -0.708200560 -0.075177080
## 123 -0.519014277  0.447263853
## 124 -0.680848129  0.352825110
## 125  0.282728283  1.153121839
## 126  0.022499536  0.393866478
## 127 -0.053072875 -0.244175362
## 128  0.608482094  0.035137352
## 129  0.164191152 -0.554219059
## 130 -0.253355274 -0.788071219
## 131 -0.197367960 -0.212041641
## 132 -0.530606372 -0.070597023
## 133  0.152170216  1.004298802
## 134 -0.286565777  0.501736959
## 135 -0.356187352  0.012591244
## 136  0.322749117  0.226096128
## 137  0.347744730 -0.210451747
## 138  1.462421548  0.842370437
## 139  0.693439150  0.248920601
## 140 -0.149815924 -0.128385221
## 141 -0.650802680 -0.190603071
## 142 -0.698471415  0.037960806
## 143 -0.613889330 -0.075086459
## 144  0.100342799  0.164951260
## 145  0.217928208 -0.232696208
## 146  1.181706360  0.585073446
## 147  0.658905193  0.108735750
## 148 -0.075705565 -0.260885535
## 149 -0.527811658 -0.281523786
## 150 -0.663957925 -0.037045029
## 151 -0.706556231 -0.055588612
## 152 -0.150290736  0.258973427
## 153 -0.053242795 -0.062248134
## 154  0.905934091  0.616775624
## 155  0.473524258 -0.010828287
## 156  0.043801975 -0.320031348
## 157  0.311419070  0.304951720
## 158 -0.343186629  0.011768540
## 159 -0.686679687 -0.093361465
## 160 -0.481868930  0.196811584
## 161 -0.553398340  0.023163537
## 162  0.289653633  0.602768591
## 163 -0.029087034 -0.048171722
## 164 -0.173586410 -0.508600662
## 165  0.192468033 -0.126814541
## 166 -0.057980593 -0.240710385
## 167  0.711771388  0.908506729
## 168  0.040103803  0.548835704
## 169 -0.412802114  0.255671960
## 170  0.203068505  0.809602486
## 171 -0.102927616  0.201285785
## 172 -0.222521082 -0.279901108
## 173  0.188357473 -0.062633164
## 174 -0.006826831 -0.295023927
## 175  0.654317366  0.569555814
## 176  0.017478135  0.233284383
## 177 -0.452931023  0.056987093
## 178 -0.136767142  0.534553947
## 179 -0.491993516  0.053636550
## 180 -0.565823514 -0.305561517
## 181 -0.390256236 -0.452667983
## 182 -0.357627992 -0.674751948
## 183  0.028388888 -0.253930227
## 184 -0.196198269 -0.334281663
## 185  0.400154381  0.685441082
## 186 -0.230823368  0.283254852
## 187 -0.512240759 -0.003781957
## 188 -0.065681838  0.370969516
## 189 -0.124693050 -0.007924483
## 190  0.851771560  0.883539497
## 191  0.405967388  0.254202920
## 192 -0.053125378 -0.161044730
## 193  0.328886854  0.456937380
## 194 -0.244147048  0.086110183
## 195 -0.561209480 -0.144014619
## 196 -0.308794518  0.150441856
## 197 -0.365057763 -0.120331760
## 198  0.443562955  0.551568781
## 199  0.027729421 -0.091650217
## 200 -0.322064983 -0.437210712

8 Plotting PCA

The Biplot also have another way for visualization by using plot.PCA. Plot PCA shows the group of data and outliers.

plot.PCA(
  x = Penicillin_pca, # object pca
  choix = "ind", # pilihan, untuk menampilkan plot individual
)

plot.PCA(
  x = Penicillin_pca,
  choix = "var"
)
## Warning: ggrepel: 28 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

Also, another way to check which variable have significant impact by using function dimdesc. The correlation value list the rangking of significant variables.

Penicillin_dim <- dimdesc(Penicillin_pca)

Penicillin_dim$Dim.1$quanti %>% as.data.frame()
##                                                         correlation
## X2.PAT.control.PAT_ref.PAT.ref.                           0.9955172
## X1.Raman.spec.recorded                                    0.9955172
## Water.for.injection.dilution.Fw.L.h.                      0.9955172
## Batch.reference.Batch_ref.Batch.ref.                      0.9955172
## Substrate.concentration.S.g.L.                            0.9946835
## Penicillin.concentration.P.g.L.                           0.9942874
## Time..h.                                                  0.9924983
## Vessel.Weight.Wt.Kg.                                      0.9854959
## Vessel.Volume.V.L.                                        0.9803943
## Carbon.evolution.rate.CER.g.h.                            0.9791001
## Generated.heat.Q.kJ.                                      0.9628192
## Air.head.pressure.pressure.bar.                           0.9625981
## carbon.dioxide.percent.in.off.gas.CO2outgas...            0.9589103
## Aeration.rate.Fg.L.h.                                     0.9425874
## Batch.ID                                                  0.9360245
## Fault.flag                                                0.9356546
## Sugar.feed.rate.Fs.L.h.                                   0.8190677
## PAA.flow.Fpaa.PAA.flow..L.h..                             0.7054024
## Heating.water.flow.rate.Fh.L.h.                           0.4733881
## Oxygen.in.percent.in.off.gas.O2.O2......                  0.4370433
## pH.pH.pH.                                                 0.2084972
## Acid.flow.rate.Fa.L.h.                                    0.1972050
## Offline.Penicillin.concentration.P_offline.P.g.L...1...   0.1593926
## Viscosity.Viscosity_offline.centPoise.                    0.1539052
## Offline.Biomass.concentratio.X_offline.X.g.L...1...       0.1500103
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...     0.1429271
## Dumped.broth.flow.Fremoved.L.h.                          -0.2535978
## Oxygen.Uptake.Rate.OUR..g.min...1...                     -0.4397498
## Temperature.T.K.                                         -0.5275643
## Heating.cooling.water.flow.rate.Fc.L.h.                  -0.5782750
## Base.flow.rate.Fb.L.h.                                   -0.7336845
## Oil.flow.Foil.L.hr.                                      -0.7625361
##                                                               p.value
## X2.PAT.control.PAT_ref.PAT.ref.                         9.195904e-205
## X1.Raman.spec.recorded                                  9.195904e-205
## Water.for.injection.dilution.Fw.L.h.                    9.195904e-205
## Batch.reference.Batch_ref.Batch.ref.                    9.195904e-205
## Substrate.concentration.S.g.L.                          1.904695e-197
## Penicillin.concentration.P.g.L.                         2.295776e-194
## Time..h.                                                1.090146e-182
## Vessel.Weight.Wt.Kg.                                    1.721819e-154
## Vessel.Volume.V.L.                                      1.218374e-141
## Carbon.evolution.rate.CER.g.h.                          6.407187e-139
## Generated.heat.Q.kJ.                                    1.682780e-114
## Air.head.pressure.pressure.bar.                         2.993402e-114
## carbon.dioxide.percent.in.off.gas.CO2outgas...          2.754635e-110
## Aeration.rate.Fg.L.h.                                    2.950028e-96
## Batch.ID                                                 9.571644e-92
## Fault.flag                                               1.662867e-91
## Sugar.feed.rate.Fs.L.h.                                  1.142356e-49
## PAA.flow.Fpaa.PAA.flow..L.h..                            2.027695e-31
## Heating.water.flow.rate.Fh.L.h.                          1.450763e-12
## Oxygen.in.percent.in.off.gas.O2.O2......                 9.779517e-11
## pH.pH.pH.                                                3.049095e-03
## Acid.flow.rate.Fa.L.h.                                   5.126765e-03
## Offline.Penicillin.concentration.P_offline.P.g.L...1...  2.416756e-02
## Viscosity.Viscosity_offline.centPoise.                   2.956376e-02
## Offline.Biomass.concentratio.X_offline.X.g.L...1...      3.399086e-02
## PAA.concentration.offline.PAA_offline.PAA..g.L...1...    4.348698e-02
## Dumped.broth.flow.Fremoved.L.h.                          2.908149e-04
## Oxygen.Uptake.Rate.OUR..g.min...1...                     7.268698e-11
## Temperature.T.K.                                         1.002775e-15
## Heating.cooling.water.flow.rate.Fc.L.h.                  3.052754e-19
## Base.flow.rate.Fb.L.h.                                   4.549809e-35
## Oil.flow.Foil.L.hr.                                      2.636817e-39

9 Contribution of each variables

fviz_contrib(X = Penicillin_pca,
             choice = "var",
             axes = 1)

summary(Penicillin_pca)
## 
## Call:
## PCA(X = Penicillin_clean, scale.unit = T, ncp = 8, graph = F) 
## 
## 
## Eigenvalues
##                        Dim.1   Dim.2   Dim.3   Dim.4   Dim.5   Dim.6   Dim.7
## Variance              18.998   4.863   4.411   2.011   1.361   0.654   0.423
## % of var.             55.877  14.304  12.972   5.915   4.003   1.923   1.243
## Cumulative % of var.  55.877  70.181  83.153  89.068  93.072  94.995  96.238
##                        Dim.8   Dim.9  Dim.10  Dim.11  Dim.12  Dim.13  Dim.14
## Variance               0.335   0.253   0.189   0.127   0.112   0.074   0.060
## % of var.              0.984   0.744   0.557   0.374   0.330   0.216   0.176
## Cumulative % of var.  97.222  97.965  98.522  98.896  99.226  99.443  99.619
##                       Dim.15  Dim.16  Dim.17  Dim.18  Dim.19  Dim.20  Dim.21
## Variance               0.044   0.037   0.019   0.019   0.005   0.002   0.001
## % of var.              0.129   0.110   0.056   0.055   0.014   0.005   0.003
## Cumulative % of var.  99.748  99.858  99.914  99.969  99.983  99.988  99.991
##                       Dim.22  Dim.23  Dim.24  Dim.25  Dim.26  Dim.27  Dim.28
## Variance               0.001   0.001   0.001   0.000   0.000   0.000   0.000
## % of var.              0.003   0.003   0.002   0.001   0.001   0.000   0.000
## Cumulative % of var.  99.995  99.997  99.999  99.999 100.000 100.000 100.000
##                       Dim.29  Dim.30  Dim.31  Dim.32  Dim.33  Dim.34
## Variance               0.000   0.000   0.000   0.000   0.000   0.000
## % of var.              0.000   0.000   0.000   0.000   0.000   0.000
## Cumulative % of var. 100.000 100.000 100.000 100.000 100.000 100.000
## 
## Individuals (the 10 first)
##                                                             Dist    Dim.1
## 1                                                       |  6.917 | -4.869
## 2                                                       |  6.877 | -4.580
## 3                                                       |  7.141 | -4.385
## 4                                                       |  7.242 | -4.118
## 5                                                       |  8.065 | -3.721
## 6                                                       |  7.201 | -3.768
## 7                                                       |  7.152 | -3.719
## 8                                                       |  7.191 | -3.700
## 9                                                       |  6.762 | -3.841
## 10                                                      |  6.778 | -3.871
##                                                            ctr   cos2    Dim.2
## 1                                                        0.624  0.496 |  0.287
## 2                                                        0.552  0.444 |  0.217
## 3                                                        0.506  0.377 |  0.120
## 4                                                        0.446  0.323 |  0.045
## 5                                                        0.364  0.213 |  2.391
## 6                                                        0.374  0.274 | -0.019
## 7                                                        0.364  0.270 | -0.012
## 8                                                        0.360  0.265 |  0.003
## 9                                                        0.388  0.323 |  0.155
## 10                                                       0.394  0.326 |  0.196
##                                                            ctr   cos2    Dim.3
## 1                                                        0.008  0.002 | -3.175
## 2                                                        0.005  0.001 | -4.433
## 3                                                        0.001  0.000 | -4.860
## 4                                                        0.000  0.000 | -5.164
## 5                                                        0.588  0.088 | -5.350
## 6                                                        0.000  0.000 | -5.489
## 7                                                        0.000  0.000 | -5.502
## 8                                                        0.000  0.000 | -5.470
## 9                                                        0.002  0.001 | -5.281
## 10                                                       0.004  0.001 | -5.196
##                                                            ctr   cos2  
## 1                                                        1.143  0.211 |
## 2                                                        2.228  0.416 |
## 3                                                        2.678  0.463 |
## 4                                                        3.024  0.508 |
## 5                                                        3.245  0.440 |
## 6                                                        3.415  0.581 |
## 7                                                        3.432  0.592 |
## 8                                                        3.392  0.579 |
## 9                                                        3.162  0.610 |
## 10                                                       3.061  0.588 |
## 
## Variables (the 10 first)
##                                                            Dim.1    ctr   cos2
## Time..h.                                                |  0.992  5.185  0.985
## Aeration.rate.Fg.L.h.                                   |  0.943  4.677  0.888
## Sugar.feed.rate.Fs.L.h.                                 |  0.819  3.531  0.671
## Acid.flow.rate.Fa.L.h.                                  |  0.197  0.205  0.039
## Base.flow.rate.Fb.L.h.                                  | -0.734  2.833  0.538
## Heating.cooling.water.flow.rate.Fc.L.h.                 | -0.578  1.760  0.334
## Heating.water.flow.rate.Fh.L.h.                         |  0.473  1.180  0.224
## Water.for.injection.dilution.Fw.L.h.                    |  0.996  5.217  0.991
## Air.head.pressure.pressure.bar.                         |  0.963  4.877  0.927
## Dumped.broth.flow.Fremoved.L.h.                         | -0.254  0.339  0.064
##                                                            Dim.2    ctr   cos2
## Time..h.                                                | -0.030  0.018  0.001
## Aeration.rate.Fg.L.h.                                   | -0.039  0.031  0.001
## Sugar.feed.rate.Fs.L.h.                                 | -0.047  0.046  0.002
## Acid.flow.rate.Fa.L.h.                                  | -0.097  0.193  0.009
## Base.flow.rate.Fb.L.h.                                  |  0.014  0.004  0.000
## Heating.cooling.water.flow.rate.Fc.L.h.                 |  0.007  0.001  0.000
## Heating.water.flow.rate.Fh.L.h.                         |  0.020  0.008  0.000
## Water.for.injection.dilution.Fw.L.h.                    | -0.035  0.026  0.001
## Air.head.pressure.pressure.bar.                         | -0.042  0.036  0.002
## Dumped.broth.flow.Fremoved.L.h.                         |  0.109  0.246  0.012
##                                                            Dim.3    ctr   cos2
## Time..h.                                                |  0.087  0.171  0.008
## Aeration.rate.Fg.L.h.                                   |  0.286  1.858  0.082
## Sugar.feed.rate.Fs.L.h.                                 |  0.470  5.006  0.221
## Acid.flow.rate.Fa.L.h.                                  | -0.084  0.160  0.007
## Base.flow.rate.Fb.L.h.                                  |  0.448  4.546  0.201
## Heating.cooling.water.flow.rate.Fc.L.h.                 |  0.670 10.167  0.448
## Heating.water.flow.rate.Fh.L.h.                         |  0.006  0.001  0.000
## Water.for.injection.dilution.Fw.L.h.                    |  0.052  0.061  0.003
## Air.head.pressure.pressure.bar.                         |  0.209  0.991  0.044
## Dumped.broth.flow.Fremoved.L.h.                         | -0.056  0.070  0.003
##                                                          
## Time..h.                                                |
## Aeration.rate.Fg.L.h.                                   |
## Sugar.feed.rate.Fs.L.h.                                 |
## Acid.flow.rate.Fa.L.h.                                  |
## Base.flow.rate.Fb.L.h.                                  |
## Heating.cooling.water.flow.rate.Fc.L.h.                 |
## Heating.water.flow.rate.Fh.L.h.                         |
## Water.for.injection.dilution.Fw.L.h.                    |
## Air.head.pressure.pressure.bar.                         |
## Dumped.broth.flow.Fremoved.L.h.                         |
Penicillin_pca$eig
##           eigenvalue percentage of variance cumulative percentage of variance
## comp 1  1.899815e+01           5.587690e+01                          55.87690
## comp 2  4.863329e+00           1.430391e+01                          70.18081
## comp 3  4.410565e+00           1.297225e+01                          83.15306
## comp 4  2.011128e+00           5.915082e+00                          89.06814
## comp 5  1.361185e+00           4.003486e+00                          93.07163
## comp 6  6.538093e-01           1.922968e+00                          94.99459
## comp 7  4.225952e-01           1.242927e+00                          96.23752
## comp 8  3.346009e-01           9.841203e-01                          97.22164
## comp 9  2.528977e-01           7.438169e-01                          97.96546
## comp 10 1.892245e-01           5.565428e-01                          98.52200
## comp 11 1.272423e-01           3.742420e-01                          98.89624
## comp 12 1.122522e-01           3.301534e-01                          99.22640
## comp 13 7.358924e-02           2.164390e-01                          99.44284
## comp 14 5.991706e-02           1.762266e-01                          99.61906
## comp 15 4.372847e-02           1.286131e-01                          99.74767
## comp 16 3.741396e-02           1.100411e-01                          99.85772
## comp 17 1.909417e-02           5.615934e-02                          99.91388
## comp 18 1.867559e-02           5.492821e-02                          99.96880
## comp 19 4.835394e-03           1.422175e-02                          99.98303
## comp 20 1.717949e-03           5.052792e-03                          99.98808
## comp 21 1.134510e-03           3.336795e-03                          99.99141
## comp 22 1.049859e-03           3.087821e-03                          99.99450
## comp 23 8.975892e-04           2.639968e-03                          99.99714
## comp 24 5.343709e-04           1.571679e-03                          99.99871
## comp 25 2.391284e-04           7.033187e-04                          99.99942
## comp 26 1.860244e-04           5.471304e-04                          99.99996
## comp 27 9.102565e-06           2.677225e-05                          99.99999
## comp 28 2.266718e-06           6.666818e-06                         100.00000
## comp 29 6.112465e-07           1.797784e-06                         100.00000
## comp 30 2.879639e-09           8.469526e-09                         100.00000
## comp 31 1.870981e-10           5.502886e-10                         100.00000
## comp 32 5.583299e-31           1.642147e-30                         100.00000
## comp 33 1.773000e-31           5.214707e-31                         100.00000
## comp 34 5.630238e-32           1.655952e-31                         100.00000
Penicillin_keep <- Penicillin_pca$ind$coord[,1:5] %>% 
  as.data.frame()

Penicillin_keep %>% head()
##       Dim.1       Dim.2     Dim.3      Dim.4       Dim.5
## 1 -4.869169  0.28675711 -3.175056 -1.0892563  0.99854214
## 2 -4.580076  0.21664951 -4.432756 -0.3991510  0.51718424
## 3 -4.385247  0.11995016 -4.860014  0.5602269  0.20430577
## 4 -4.118362  0.04486635 -5.164468  1.2732793 -0.07875848
## 5 -3.720834  2.39149583 -5.350491  2.0468900 -0.44743383
## 6 -3.767883 -0.01948551 -5.488533  1.9402648 -0.50970545
# reconstruct data PC1 - PC5
Penicillin_reconst <- reconst(Penicillin_pca, 
                        ncp = 34) 

head(data.frame(Penicillin_reconst), 3)
##     Time..h. Aeration.rate.Fg.L.h. Sugar.feed.rate.Fs.L.h.
## 1 -14.092285              29.13081                7.905378
## 2  -7.151143              29.40315                2.438596
## 3  -4.335031              29.72706                2.647362
##   Acid.flow.rate.Fa.L.h. Base.flow.rate.Fb.L.h.
## 1             -0.6760913               30.36147
## 2             -0.5470397               40.70391
## 3             -0.2034562               47.39887
##   Heating.cooling.water.flow.rate.Fc.L.h. Heating.water.flow.rate.Fh.L.h.
## 1                                22.43190                       25.867436
## 2                                18.16832                       10.449894
## 3                                13.79194                        5.397766
##   Water.for.injection.dilution.Fw.L.h. Air.head.pressure.pressure.bar.
## 1                           -24.960815                       0.5836014
## 2                           -13.998870                       0.5794435
## 3                            -8.747638                       0.5806842
##   Dumped.broth.flow.Fremoved.L.h. Substrate.concentration.S.g.L.
## 1                        483.8761                     -4.8555578
## 2                        483.9234                     -1.7840465
## 3                        216.9242                     -0.6765232
##   Dissolved.oxygen.concentration.DO2.mg.L. Penicillin.concentration.P.g.L.
## 1                                 14.17876                      -0.6926179
## 2                                 14.52519                      -0.4494474
## 3                                 14.59292                      -0.2943982
##   Vessel.Volume.V.L. Vessel.Weight.Wt.Kg. pH.pH.pH. Temperature.T.K.
## 1           57766.61             61498.92  6.484773         298.1325
## 2           58192.76             62068.62  6.521536         298.1310
## 3           58311.74             62259.65  6.552147         298.1255
##   Generated.heat.Q.kJ. carbon.dioxide.percent.in.off.gas.CO2outgas...
## 1            -1.925479                                     0.08129982
## 2            -2.972295                                     0.05200333
## 3            -3.720737                                     0.05765899
##   PAA.flow.Fpaa.PAA.flow..L.h..
## 1                      2.983965
## 2                      4.754315
## 3                      5.664836
##   PAA.concentration.offline.PAA_offline.PAA..g.L...1... Oil.flow.Foil.L.hr.
## 1                                              19.62366            26.26394
## 2                                              39.06389            23.04186
## 3                                              50.09825            21.67831
##   NH_3.concentration.off.line.NH3_offline.NH3..g.L...1...
## 1                                                35.71872
## 2                                               119.62714
## 3                                               168.35982
##   Oxygen.Uptake.Rate.OUR..g.min...1... Oxygen.in.percent.in.off.gas.O2.O2......
## 1                          0.193232417                                0.2015992
## 2                          0.040894075                                0.2042091
## 3                          0.002923577                                0.2050455
##   Offline.Penicillin.concentration.P_offline.P.g.L...1...
## 1                                             -0.01293145
## 2                                             -0.08408262
## 3                                             -0.12490274
##   Offline.Biomass.concentratio.X_offline.X.g.L...1...
## 1                                         -0.02410792
## 2                                         -0.14573600
## 3                                         -0.21441951
##   Carbon.evolution.rate.CER.g.h. Viscosity.Viscosity_offline.centPoise.
## 1                  -0.0147559506                              -0.181744
## 2                  -0.0131815570                              -1.067650
## 3                   0.0001921265                              -1.585490
##   X1.Raman.spec.recorded X2.PAT.control.PAT_ref.PAT.ref.
## 1              -8.884483                       -8.884483
## 2              -4.543553                       -4.543553
## 3              -2.464064                       -2.464064
##   Batch.reference.Batch_ref.Batch.ref.  Batch.ID Fault.flag
## 1                          -0.09984326 12555.386   12549.72
## 2                          -0.05599548  7339.345    7362.67
## 3                          -0.03499055  4602.015    4636.97

10 Conclusion

  1. The PCA analysis of Bioreactors for Penicillin production was successfully conducted.
  2. The imprtant PC to keep 90% information is PC1 to PC5.
  3. Most significant variable is “X2.PAT.control.PAT_ref.PAT.ref.” and less significant variable is “Oil.flow.Foil.L.hr.”.