Importing libaries
library(rstatix)
##
## Attaching package: 'rstatix'
## The following object is masked from 'package:stats':
##
## filter
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr 1.1.4 ✔ readr 2.1.5
## ✔ forcats 1.0.0 ✔ stringr 1.5.1
## ✔ ggplot2 3.5.1 ✔ tibble 3.2.1
## ✔ lubridate 1.9.3 ✔ tidyr 1.3.1
## ✔ purrr 1.0.2
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks rstatix::filter(), stats::filter()
## ✖ dplyr::lag() masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(ggplot2)
library(tidyr)
library(dplyr, warn=FALSE)
library(readxl)
Extracting dataset - standards
Fructose_0.5_T1 = read_delim('FRUCTOSE_05_1_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fructose_1.0_T3 = read_delim('FRUCTOSE_10_3_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fructose_2.0_T3 = read_delim('FRUCTOSE_20_3_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fructose_0.25_T2 = read_delim('FRUCTOSE_025_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fructose_2.5_T2 = read_delim('FRUCTOSE_25_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_0.5_T2 = read_delim('GLUCOSE_05_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_1.0_T2 = read_delim('GLUCOSE_10_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_2.0_T3 = read_delim('GLUCOSE_20_3_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_0.25_T1 = read_delim('GLUCOSE_025_1_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_2.5_T2 = read_delim('GLUCOSE_25_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_0.5_T2 = read_delim('Sucrose_05_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_1.0_T2 = read_delim('Sucrose_10_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_2.0_T2 = read_delim('Sucrose_20_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_4.0_T2 = read_delim('Sucrose_40_2_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_5.0_T3 = read_delim('Sucrose_50_3_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Xylose_0.5_T3 = read_delim('Xylose_05_3_spectra.CSV',
delim =",",
col_names = F)
## Rows: 2100 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
ElectroPherogram - standards
ggplot(data=Xylose_0.5_T3,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.x = element_blank(),
axis.ticks.y = element_blank(),
aspect.ratio = 0.5)+
scale_x_continuous(n.breaks = 20)+
scale_y_continuous(n.breaks = 20)+
ggtitle("Xylose (0.5 g/L)")+
labs(x="Retention Time (min)", y="Signal (mAU)") +
geom_hline(yintercept=0)
ggplot(data=Fructose_0.25_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Fructose_0.25_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Fructose_0.5_T1,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Fructose_0.5_T1")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Fructose_1.0_T3,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Fructose_1.0_T3")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Fructose_2.0_T3,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Fructose_2.0_T3")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Fructose_2.5_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Fructose_2.5_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Glucose_0.25_T1,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Glucose_0.25_T1")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Glucose_0.5_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Glucose_0.5_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Glucose_1.0_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Glucose_1.0_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Glucose_2.0_T3,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Glucose_2.0_T3")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Glucose_2.5_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Glucose_2.5_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Sucrose_0.5_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Sucrose_0.5_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Sucrose_1.0_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Sucrose_1.0_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Sucrose_2.0_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Sucrose_2.0_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Sucrose_4.0_T2,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Sucrose_4.0_T2")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Sucrose_5.0_T3,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Sucrose_5.0_T3")+
labs(x="Retention Time (min)", y="Signal (mAU)")
Highest Conc standards
Xylose_signal_samples = read_delim('Xylose_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Xylose_integration_samples = read_delim('Xylose_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 2 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_signal_samples = read_delim('Sucrose_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Sucrose_integration_samples = read_delim('Sucrose_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 5 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_signal_samples = read_delim('Glucose_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Glucose_integration_samples = read_delim('Glucose_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 6 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fructose_signal_samples = read_delim('Fructose_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fructose_integration_samples = read_delim('Fructose_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 5 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Electropherograms - high conc standards
ggplot(data=Sucrose_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Sucrose_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Fructose_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Fructose_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Glucose_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Glucose_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Xylose_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Xylose_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
Cereal Sample Integration and data
Cornflakes_signal_samples = read_delim('Cornflakes_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Cornflakes_integration_samples = read_delim('Cornflakes_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 5 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
SpecialK_signal_samples = read_delim('SpecialK_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
SpecialK_integration_samples = read_delim('SpecialK_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 6 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Choco_Shells_signal_samples = read_delim('Choco_Shells_signal_samples.CSV',
delim =",",
col_names = F)
## Rows: 3750 Columns: 2
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (2): X1, X2
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Choco_Shells_integration_samples = read_delim('Choco_Shells_integration_samples.CSV',
delim =",",
col_names = T)
## Rows: 7 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (5): X, Ret_time, Area, Height, Width
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Electropherograms - samples
ggplot(data=Choco_Shells_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Choco_Shells_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=Cornflakes_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("Cornflakes_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
ggplot(data=SpecialK_signal_samples,
mapping =aes(x = X1,
y = X2)) +
geom_line() +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
legend.position="none")+
ggtitle("SpecialK_signal_samples")+
labs(x="Retention Time (min)", y="Signal (mAU)")
Different conc on same graph - Sucrose
ggplot(mapping =aes(x = X1,
y = X2)) +
geom_line(data=Sucrose_0.5_T2, colour = "red") +
geom_line(data=Sucrose_1.0_T2, colour = "orange") +
geom_line(data=Sucrose_2.0_T2, colour = "green") +
geom_line(data=Sucrose_4.0_T2, colour = "blue") +
geom_line(data=Sucrose_5.0_T3, colour = "violet") +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank()) +
ggtitle("Sucrose")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Sucrose data - rebasline
RE.Sucrose0.5 = Sucrose_0.5_T2%>%
mutate(REX2 = X2 - 2.43139267)
RE.Sucrose1.0 = Sucrose_1.0_T2%>%
mutate(REX2 = X2 - 0.909805298)
RE.Sucrose2.0 = Sucrose_2.0_T2%>%
mutate(REX2 = X2 - 0.22649765)
RE.Sucrose4.0 = Sucrose_4.0_T2%>%
mutate(REX2 = X2 + 1.13582611)
RE.Sucrose5.0 = Sucrose_5.0_T3%>%
mutate(REX2 = X2 +2.237796783)
Graphically rebasline after 2 minutes to line up to where we kept a consistant voltage (16kV)
ggplot(mapping =aes(x = X1,
y = REX2)) +
geom_line(data=RE.Sucrose0.5, colour = "red") +
geom_line(data=RE.Sucrose1.0, colour = "orange") +
geom_line(data=RE.Sucrose2.0, colour = "green") +
geom_line(data=RE.Sucrose4.0, colour = "blue") +
geom_line(data=RE.Sucrose5.0, colour = "violet") +
theme_bw() +
theme(axis.ticks.x = element_blank(),
axis.ticks.y = element_blank(),
aspect.ratio = 0.5)+
scale_x_continuous(n.breaks = 20)+
scale_y_continuous(n.breaks = 20)+
ggtitle("Sucrose Rebaselined after 2 minutes")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Fructose all conc
ggplot(mapping =aes(x = X1,
y = X2)) +
geom_line(data=Fructose_0.25_T2, colour = "red") +
geom_line(data=Fructose_0.5_T1, colour = "orange") +
geom_line(data=Fructose_1.0_T3, colour = "green") +
geom_line(data=Fructose_2.0_T3, colour = "blue") +
geom_line(data=Fructose_2.5_T2, colour = "violet") +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank()) +
ggtitle("fructose")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Glucose all conc
ggplot(mapping =aes(x = X1,
y = X2)) +
geom_line(data=Glucose_0.25_T1, colour = "red") +
geom_line(data=Glucose_0.5_T2, colour = "orange") +
geom_line(data=Glucose_1.0_T2, colour = "green") +
geom_line(data=Glucose_2.0_T3, colour = "blue") +
geom_line(data=Glucose_2.5_T2, colour = "violet") +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank()) +
ggtitle("Glucose")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
All 0.5g conc
ggplot(mapping =aes(x = X1,
y = X2)) +
geom_line(data=Xylose_0.5_T3, colour = "red") +
geom_line(data=Sucrose_0.5_T2, colour = "orange") +
geom_line(data=Fructose_0.5_T1, colour = "green") +
geom_line(data=Glucose_0.5_T2, colour = "blue") +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank()) +
ggtitle("0.5g conc")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
all 5.0g conc
ggplot(mapping =aes(x = X1,
y = X2)) +
geom_line(data=Xylose_signal_samples, colour = "red") +
geom_line(data=Sucrose_signal_samples, colour = "orange") +
geom_line(data=Fructose_signal_samples, colour = "green") +
geom_line(data=Glucose_signal_samples, colour = "blue") +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank(),
panel.grid.major = element_blank(),
panel.grid.minor = element_blank()) +
ggtitle("All 5.0g conc")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
All samples
ggplot(mapping =aes(x = X1,
y = X2)) +
geom_line(data=Cornflakes_signal_samples, colour = "red") +
geom_line(data=SpecialK_signal_samples, colour = "green") +
geom_line(data=Choco_Shells_signal_samples, colour = "blue") +
theme_bw() +
theme(axis.ticks.y = element_blank(),
panel.border = element_blank())+
ggtitle("All Cereals")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Rebaseline fructose
RE.Fructose0.25 = Fructose_0.25_T2%>%
mutate(REX2 = X2 + 7.279872894)
RE.Fructose0.5 = Fructose_0.5_T1%>%
mutate(REX2 = X2 + 7.385730743)
RE.Fructose1.0 = Fructose_1.0_T3%>%
mutate(REX2 = X2 + 6.854057312)
RE.Fructose2.0 = Fructose_2.0_T3%>%
mutate(REX2 = X2 + 6.74533844)
RE.Fructose2.5 = Fructose_2.5_T2%>%
mutate(REX2 = X2 + 6.49023056)
Graph rebaseline fructose
ggplot(mapping =aes(x = X1,
y = REX2)) +
geom_line(data=RE.Fructose0.25, colour = "red") +
geom_line(data=RE.Fructose0.5, colour = "orange") +
geom_line(data=RE.Fructose1.0, colour = "green") +
geom_line(data=RE.Fructose2.0, colour = "blue") +
geom_line(data=RE.Fructose2.5, colour = "violet") +
theme_bw() +
theme(axis.ticks.x = element_blank(),
axis.ticks.y = element_blank(),
aspect.ratio = 0.5) +
scale_x_continuous(n.breaks = 20)+
scale_y_continuous(n.breaks = 20)+
ggtitle("Fructose Rebaselined after 2 minutes")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Rebaseline and graph - Glucose
RE.Glucose0.25 = Glucose_0.25_T1%>%
mutate(REX2 = X2 + 2.404689789)
RE.Glucose0.5 = Glucose_0.5_T2%>%
mutate(REX2 = X2 + 5.020141602)
RE.Glucose1.0 = Glucose_1.0_T2%>%
mutate(REX2 = X2 + 5.916595459)
RE.Glucose2.0 = Glucose_2.0_T3%>%
mutate(REX2 = X2 + 6.852149963)
RE.Glucose2.5 = Glucose_2.5_T2%>%
mutate(REX2 = X2 + 7.067680359)
ggplot(mapping =aes(x = X1,
y = REX2)) +
geom_line(data=RE.Glucose0.25, colour = "red") +
geom_line(data=RE.Glucose0.5, colour = "orange") +
geom_line(data=RE.Glucose1.0, colour = "green") +
geom_line(data=RE.Glucose2.0, colour = "blue") +
geom_line(data=RE.Glucose2.5, colour = "violet") +
theme_bw() +
theme(axis.ticks.x = element_blank(),
axis.ticks.y = element_blank(),
aspect.ratio = 0.5) +
scale_x_continuous(n.breaks = 20)+
scale_y_continuous(n.breaks = 20)+
ggtitle("Glucose Rebaselined after 2 minutes")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Rebaseline Samples??
RE.Cornflakes = Cornflakes_signal_samples%>%
mutate(REX2 = X2 + 4.78887558)
RE.Specialk = SpecialK_signal_samples%>%
mutate(REX2 = X2 + 4.722595215)
RE.ChocoShells = Choco_Shells_signal_samples%>%
mutate(REX2 = X2 + 5.333423615)
ggplot(mapping =aes(x = X1,
y = REX2)) +
geom_line(data=RE.Cornflakes, colour = "red") +
geom_line(data=RE.Specialk, colour = "green") +
geom_line(data=RE.ChocoShells, colour = "blue") +
theme_bw() +
theme(axis.ticks.x = element_blank(),
axis.ticks.y = element_blank(),
aspect.ratio = 0.5) +
scale_x_continuous(n.breaks = 20)+
scale_y_continuous(n.breaks = 20)+
#added scale to x and y
ggtitle("All Cereal samples rebaselined after 2 minutes")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)
Rebasline of 5.0g ~ rework
ggplot(mapping =aes(x = X1,
y = REX2)) +
geom_line(data=RE.Sucrose0.5, colour = "red") +
geom_line(data=RE.Fructose0.5, colour = "green") +
geom_line(data=RE.Glucose0.5, colour = "blue") +
theme_bw() +
theme(axis.ticks.x = element_blank(),
axis.ticks.y = element_blank(),
aspect.ratio = 0.5) +
scale_x_continuous(n.breaks = 20)+
scale_y_continuous(n.breaks = 20)+
ggtitle("Sugars(0.5g) - rebaselined after 2 minutes")+
labs(x="Retention Time (min)", y="Signal (mAU)")+
geom_hline(yintercept=0)