#### outcome.test1
OT1 <- outcome.test1[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Acetoacetate",OT1$Name)
OT1$Metabolite<- 0
OT1$Metabolite<- ifelse(OT1$Metabolite==0,"AcAce",OT1$Metabolite)
Acetoacetate<- OT1[order(OT1$pval), ]
Acetoacetate
write.csv(Acetoacetate, "Acetoacetate.csv")
OT2 <- outcome.test1[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Acetate",OT2$Name)
OT2$Metabolite<- 0
OT2$Metabolite<- ifelse(OT2$Metabolite==0,"Ace",OT2$Metabolite)
Acetate <- OT2[order(OT2$pval), ]
Acetate
write.csv(Acetate, "Acetate.csv")
OT3 <- outcome.test1[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Alanine",OT3$Name)
OT3$Metabolite<- 0
OT3$Metabolite<- ifelse(OT3$Metabolite==0,"Ala",OT3$Metabolite)
Alanine <- OT3[order(OT3$pval), ]
Alanine
write.csv(Alanine, "Alanine.csv")
OT4 <- outcome.test1[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Albumin",OT4$Name)
OT4$Metabolite<- 0
OT4$Metabolite<- ifelse(OT4$Metabolite==0,"Alb",OT4$Metabolite)
Albumin <- OT4[order(OT4$pval), ]
Albumin ###Got one! But in Japanese population; 3 snps; pval=0.003; ML method
write.csv(Albumin, "Albumin.csv")
OT5 <- outcome.test1[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Apolipoprotein.a1 ",OT5$Name)
OT5$Metabolite<- 0
OT5$Metabolite<- ifelse(OT5$Metabolite==0,"ApoA1",OT5$Metabolite)
Apolipoprotein.a1 <- OT5[order(OT5$pval), ]
Apolipoprotein.a1 #doublecheck
write.csv(Apolipoprotein.a1, "Apolipoprotein.a1.csv")
OT6 <- outcome.test1[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Apolipoprotein.B ",OT6$Name)
OT6$Metabolite<- 0
OT6$Metabolite<- ifelse(OT6$Metabolite==0,"ApoB",OT6$Metabolite)
Apolipoprotein.B <- OT6[order(OT6$pval), ]
Apolipoprotein.B# doublecheck
write.csv(Apolipoprotein.B, "Apolipoprotein.B.csv")
OT7 <- outcome.test1[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"UNK.Ratio.of.bisallylic.groups.to.double.bonds",OT7$Name)
OT7$Metabolite<- 0
OT7$Metabolite<- ifelse(OT7$Metabolite==0,"Ratio.of.bisallylic.groups.to.double.bonds",OT7$Metabolite)
Ratio.of.bisallylic.groups.to.double.bonds <- OT7[order(OT7$pval), ]
Ratio.of.bisallylic.groups.to.double.bonds
write.csv(Ratio.of.bisallylic.groups.to.double.bonds, "Ratio.of.bisallylic.groups.to.double.bonds.csv")
OT8 <- outcome.test1[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"UNK.Ratio.of.bisallylic.groups.to.fatty.acids",OT8$Name)
OT8$Metabolite<- 0
OT8$Metabolite<- ifelse(OT8$Metabolite==0,"Ratio.of.bisallylic.groups.to.fatty.acids",OT8$Metabolite)
Ratio.of.bisallylic.groups.to.fatty.acids <- OT8[order(OT8$pval), ]
Ratio.of.bisallylic.groups.to.fatty.acids
write.csv(Ratio.of.bisallylic.groups.to.fatty.acids, "Ratio.of.bisallylic.groups.to.fatty.acids.csv")
OT9 <- outcome.test1[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"three.hydroxybutyrate",OT9$Name)
OT9$Metabolite<- 0
OT9$Metabolite<- ifelse(OT9$Metabolite==0,"bOHBut",OT9$Metabolite)
three.hydroxybutyrate <- OT9[order(OT9$pval), ]
write.csv(three.hydroxybutyrate, "three.hydroxybutyrate.csv")
OT10 <- outcome.test1[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Average.number.of.methylene.groups.per.double.bond",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"UNK.Average.number.of.methylene.groups.per.double.bond",OT10$Metabolite)
Average.number.of.methylene.groups.per.double.bond <- OT10[order(OT10$pval), ]
Average.number.of.methylene.groups.per.double.bond
write.csv(Average.number.of.methylene.groups.per.double.bond, "Average.number.of.methylene.groups.per.double.bond.csv")
#### outcome.test2
OT1 <- outcome.test2[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Average.number.of.methylene.groups.in.a.fatty.acid.chain",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"UNK.Average.number.of.methylene.groups.in.a.fatty.acid.chain",OT1$Metabolite)
Average.number.of.methylene.groups.in.a.fatty.acid.chain <- OT1[order(OT1$pval), ]
Average.number.of.methylene.groups.in.a.fatty.acid.chain
write.csv(Average.number.of.methylene.groups.in.a.fatty.acid.chain, "Average.number.of.methylene.groups.in.a.fatty.acid.chain.csv")
OT2 <- outcome.test2[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Citrate",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"Cit",OT2$Metabolite)
Citrate <- OT2[order(OT2$pval), ]
Citrate ###Got one! But 86 SNPs 0.05/86=0.0006 and p-value is 0.02 ML & IVW
write.csv(Citrate, "Citrate.csv")
OT3 <- outcome.test2[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Creatinine",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"Crea",OT3$Metabolite)
Creatinine <- OT3[order(OT3$pval), ]
Creatinine
write.csv(Creatinine, "Creatinine.csv")
OT4 <- outcome.test2[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Average.number.of.double.bonds.in.a.fatty.acid.chain",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"UNK.Average.number.of.double.bonds.in.a.fatty.acid.chain",OT4$Metabolite)
Average.number.of.double.bonds.in.a.fatty.acid.chain <- OT4[order(OT4$pval), ]
Average.number.of.double.bonds.in.a.fatty.acid.chain
write.csv(Average.number.of.double.bonds.in.a.fatty.acid.chain, "Average.number.of.double.bonds.in.a.fatty.acid.chain.csv")
OT5 <- outcome.test2[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"docosahexaenoic.acid",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"DHA",OT5$Metabolite)
docosahexaenoic.acid <- OT5[order(OT5$pval), ]
docosahexaenoic.acid ### Got one! But in Japanese population. p-value=0.0342866 (IVW); 4 snps
write.csv(docosahexaenoic.acid, "DHA.csv")
OT6 <- outcome.test2[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Free.cholesterol.to.esterified.cholesterol.ratio",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"UNK.Free.cholesterol.to.esterified.cholesterol.ratio",OT6$Metabolite)
Free.cholesterol.to.esterified.cholesterol.ratio <- OT6[order(OT6$pval), ]
Free.cholesterol.to.esterified.cholesterol.ratio
write.csv(Free.cholesterol.to.esterified.cholesterol.ratio, "Free.cholesterol.to.esterified.cholesterol.ratio.csv")
OT7 <- outcome.test2[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Description.of.average.fatty.acid.chain.length.not.actual.carbon.number",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"UNK.Description.of.average.fatty.acid.chain.length.not.actual.carbon.number",OT7$Metabolite)
Description.of.average.fatty.acid.chain.length.not.actual.carbon.number <- OT7[order(OT7$pval), ]
Description.of.average.fatty.acid.chain.length.not.actual.carbon.number
write.csv(Description.of.average.fatty.acid.chain.length.not.actual.carbon.number, "Description.of.average.fatty.acid.chain.length.not.actual.carbon.number.csv")
OT8 <- outcome.test2[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Omega3.fatty.acids",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"FAw3",OT8$Metabolite)
Omega3.fatty.acids <- OT8[order(OT8$pval), ]
Omega3.fatty.acids
write.csv(Omega3.fatty.acids, "Omega3.fatty.acids.csv")
OT9 <- outcome.test2[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Omega6.fatty.acids",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"FAw6",OT9$Metabolite)
Omega6.fatty.acids <- OT9[order(OT9$pval), ]
Omega6.fatty.acids
write.csv(Omega6.fatty.acids, "Omega6.fatty.acids.csv")
OT10 <- outcome.test2[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Omega.9.and.saturated.fatty.acids",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"UNK.Omega.9.and.saturated.fatty.acids,OT10$Metabolite")
Omega.9.and.saturated.fatty.acids <- OT10[order(OT10$pval), ]
Omega.9.and.saturated.fatty.acids
write.csv(Omega.9.and.saturated.fatty.acids, "Omega.9.and.saturated.fatty.acids.csv")
#### outcome.test3
OT1 <- outcome.test3[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Free.cholesterol",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"FreeC")
Free.cholesterol <- OT1[order(OT1$pval), ]
Free.cholesterol
write.csv(Free.cholesterol, "Free.cholesterol.csv")
OT2 <- outcome.test3[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Glucose",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"Glc")
Glucose <- OT2[order(OT2$pval), ]
Glucose ###Got one! But 14 SNPs 0.05/14= 0.0034 and p-value is 0.03 ML
write.csv(Glucose, "Glucose.csv")
OT3 <- outcome.test3[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Gln",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"Glu")
Glutamine <- OT3[order(OT3$pval), ]
Glutamine
write.csv(Glutamine, "Glutamine")
OT4 <- outcome.test3[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Glycerol",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"Glol")
Glycerol <- OT4[order(OT4$pval), ]
Glycerol ###Got one! But 86 SNPs 0.05/86= 0.00058 and p-value is 0.023 IVw & 0.24 ML
write.csv(Glycerol, "Glycerol.csv")
OT5 <- outcome.test3[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Glycoproteins",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"Gp?")
Glycoproteins <- OT5[order(OT5$pval), ]
Glycoproteins
write.csv(Glycoproteins, "Glycoproteins.csv")
OT6 <- outcome.test3[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Glycoprotein.acetyls",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"Gp")
Glycoprotein.acetyls <- OT6[order(OT6$pval), ]
Glycoprotein.acetyls
write.csv(Glycoprotein.acetyls, "Glycoprotein.acetyls.csv")
OT7 <- outcome.test3[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Total.cholesterol.in.HDL",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"L.HDL.C")
Total.cholesterol.in.HDL <- OT7[order(OT7$pval), ]
Total.cholesterol.in.HDL
write.csv(Total.cholesterol.in.HDL, "Total.cholesterol.in.HDL.csv")
OT8 <- outcome.test3[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Mean.diameter.for.HDL.particles",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"HDL.D")
Mean.diameter.for.HDL.particles <- OT8[order(OT8$pval), ]
Mean.diameter.for.HDL.particles
write.csv(Mean.diameter.for.HDL.particles, "Mean.diameter.for.HDL.particles.csv")
OT9 <- outcome.test3[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Histidine",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"His")
Histidine <- OT9[order(OT9$pval), ]
Histidine
write.csv(Histidine, "Histidine.csv")
OT10 <- outcome.test3[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Total.cholesterol.in.IDL",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"IDL.C")
Total.cholesterol.in.IDL <- OT10[order(OT10$pval), ]
Total.cholesterol.in.IDL
write.csv(Total.cholesterol.in.IDL, "Total.cholesterol.in.IDL.csv")
#### outcome.test4
OT1 <- outcome.test4[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Free.cholesterol.in.IDL",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"IDL.FC")
Free.cholesterol.in.IDL <- OT1[order(OT1$pval), ]
Free.cholesterol.in.IDL
write.csv(Free.cholesterol.in.IDL, "Free.cholesterol.in.IDL.csv")
OT2 <- outcome.test4[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Total.lipids.in.IDL ",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"IDL.L")
Total.lipids.in.IDL <- OT2[order(OT2$pval), ]
Total.lipids.in.IDL
write.csv(Total.lipids.in.IDL, "Total.lipids.in.IDL.csv")
OT3 <- outcome.test4[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Concentration.of.IDL.particles",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"IDL.P")
Concentration.of.IDL.particles <- OT3[order(OT3$pval), ]
Concentration.of.IDL.particles
write.csv(Concentration.of.IDL.particles,"Concentration.of.IDL.particles.csv")
OT4 <- outcome.test4[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Phospholipids.in.IDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"IDL.PL")
Phospholipids.in.IDL <- OT4[order(OT4$pval), ]
Phospholipids.in.IDL
write.csv(Phospholipids.in.IDL, "Phospholipids.in.IDL.csv")
OT5 <- outcome.test4[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Triglycerides.in.IDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"IDL.TG")
Triglycerides.in.IDL <- OT5[order(OT5$pval), ]
Triglycerides.in.IDL
write.csv(Triglycerides.in.IDL,"Triglycerides.in.IDL.csv")
OT6 <- outcome.test4[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Isoleucine",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"Ile")
Isoleucine <- OT6[order(OT6$pval), ]
Isoleucine
write.csv(Isoleucine, "Isoleucine.csv")
OT7 <- outcome.test4[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Total.cholesterol.in.large.HDL",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"L.HDL.C")
Total.cholesterol.in.large.HDL <- OT7[order(OT7$pval), ]
Total.cholesterol.in.large.HDL
write.csv(Total.cholesterol.in.large.HDL, "Total.cholesterol.in.large.HDL.csv")
OT8 <- outcome.test4[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Cholesterol.esters.in.large.HDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"L.HDL.CE")
Cholesterol.esters.in.large.HDL <- OT8[order(OT8$pval), ]
Cholesterol.esters.in.large.HDL
write.csv(Cholesterol.esters.in.large.HDL, "Cholesterol.esters.in.large.HDL.csv")
OT9 <- outcome.test4[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Free.cholesterol.in.large.HDL",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"L.HDL.FC")
Free.cholesterol.in.large.HDL <- OT9[order(OT9$pval), ]
Free.cholesterol.in.large.HDL
write(Free.cholesterol.in.large.HDL, "Free.cholesterol.in.large.HDL.csv")
OT10 <- outcome.test4[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Total.lipids.in.large.HDL",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"L.HDL.L")
Total.lipids.in.large.HDL <- OT10[order(OT10$pval), ]
Total.lipids.in.large.HDL
write.csv(Total.lipids.in.large.HDL, "Total.lipids.in.large.HDL.csv")
#### outcome.test5
OT1 <- outcome.test5[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Concentration.of.large.HDL.particles",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"L.HDL.P")
Concentration.of.large.HDL.particles <- OT1[order(OT1$pval), ]
Concentration.of.large.HDL.particles
write.csv(Concentration.of.large.HDL.particles, "Concentration.of.large.HDL.particles.csv")
OT2 <- outcome.test5[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Phospholipids.in.large.HDL",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"L.HDL.PL")
Phospholipids.in.large.HDL <- OT2[order(OT2$pval), ]
Phospholipids.in.large.HDL
write.csv(Phospholipids.in.large.HDL, "Phospholipids.in.large.HDL.csv")
OT3 <- outcome.test5[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Total.cholesterol.in.large.LDL",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"L.LDL.C")
Total.cholesterol.in.large.LDL <- OT3[order(OT3$pval), ]
Total.cholesterol.in.large.LDL
write.csv(Total.cholesterol.in.large.LDL, "Total.cholesterol.in.large.LDL.csv")
OT4 <- outcome.test5[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Cholesterol.esters.in.large.VLDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"XL.VLDL.CE")
Cholesterol.esters.in.large.VLDL <- OT4[order(OT4$pval), ]
Cholesterol.esters.in.large.VLDL
write.csv(Cholesterol.esters.in.large.VLDL, "Cholesterol.esters.in.large.VLDL.csv")
OT5 <- outcome.test5[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Free.cholesterol.in.large.LDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"L.LDL.FC")
Free.cholesterol.in.large.LDL <- OT5[order(OT5$pval), ]
Free.cholesterol.in.large.LDL
write.csv(Free.cholesterol.in.large.LDL, "Free.cholesterol.in.large.LDL.csv")
OT6 <- outcome.test5[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Total.lipids.in.large.LDL",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"L.LDL.L", "L.LDL.L")
Total.lipids.in.large.LDL <- OT6[order(OT6$pval), ]
Total.lipids.in.large.LDL
write.csv(Total.lipids.in.large.LDL, "Total.lipids.in.large.LDL.csv")
OT7 <- outcome.test5[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Concentration.of.large.LDL.particles",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"L.LDL.P")
Concentration.of.large.LDL.particles <- OT7[order(OT7$pval), ]
Concentration.of.large.LDL.particles
write.csv(Concentration.of.large.LDL.particles, "Concentration.of.large.LDL.particles.csv")
OT8 <- outcome.test5[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Phospholipids.in.large.LDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"L.LDL.PL")
Phospholipids.in.large.LDL <- OT8[order(OT8$pval), ]
Phospholipids.in.large.LDL
write.csv(Phospholipids.in.large.LDL, "Phospholipids.in.large.LDL.csv")
OT9 <- outcome.test5[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Total.cholesterol.in.large.VLDL",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"L.VLDL.C")
Total.cholesterol.in.large.VLDL <- OT9[order(OT9$pval), ]
Total.cholesterol.in.large.VLDL
write.csv(Total.cholesterol.in.large.VLDL, "Total.cholesterol.in.large.VLDL.csv")
OT10 <- outcome.test5[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Cholesterol.esters.in.large.VLDL",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"L.VLDL.CE")
Cholesterol.esters.in.large.VLDL <- OT10[order(OT10$pval), ]
write.csv(Cholesterol.esters.in.large.VLDL, "Cholesterol.esters.in.large.VLDL.csv")
Cholesterol.esters.in.large.VLDL
write.csv(Cholesterol.esters.in.large.VLDL, "Cholesterol.esters.in.large.VLDL.csv")
#### outcome.test6
OT1 <- outcome.test6[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Free.cholesterol.in.large.VLDL",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"L.VLDL.FC")
Free.cholesterol.in.large.VLDL <- OT1[order(OT1$pval), ]
Free.cholesterol.in.large.VLDL
write.csv(Free.cholesterol.in.large.VLDL, "Free.cholesterol.in.large.VLDL.csv")
OT2 <- outcome.test6[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT3$Name==0,"Total.lipids.in.large.VLDL",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"XL.VLDL.L")
Total.lipids.in.large.VLDL <- OT2[order(OT2$pval), ]
Total.lipids.in.large.VLDL
write.csv(Total.lipids.in.large.VLDL, "Total.lipids.in.large.VLDL.csv")
OT3 <- outcome.test6[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Concentration.of.large.VLDL.particles",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"L.VLDL.P")
Concentration.of.large.VLDL.particles <- OT3[order(OT3$pval), ]
Concentration.of.large.VLDL.particles
write.csv(Concentration.of.large.VLDL.particles,"Concentration.of.large.VLDL.particles.csv")
OT4 <- outcome.test6[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Phospholipids.in.large.VLDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"L.VLDL.PL")
Phospholipids.in.large.VLDL <- OT4[order(OT4$pval), ]
Phospholipids.in.large.VLDL
write.csv(Phospholipids.in.large.VLDL, "Phospholipids.in.large.VLDL.csv")
OT5 <- outcome.test6[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Triglycerides.in.large.VLDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"L.VLDL.TG")
Triglycerides.in.large.VLDL <- OT5[order(OT5$pval), ]
Triglycerides.in.large.VLDL
write.csv(Triglycerides.in.large.VLDL, "Triglycerides.in.large.VLDL.csv")
OT6 <- outcome.test6[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"linoleic.acid",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"LA")
linoleic.acid <- OT6[order(OT6$pval), ]
linoleic.acid
write.csv(linoleic.acid, "linoleic.acid.csv")
OT7 <- outcome.test6[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Lactate",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"Lac")
Lactate <- OT7[order(OT7$pval), ]
Lactate
write.csv(Lactate, "Lactate.csv")
OT8 <- outcome.test6[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Total.cholesterol.in.LDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"LDL.C")
Total.cholesterol.in.LDL <- OT8[order(OT8$pval), ]
Total.cholesterol.in.LDL
write.csv(Total.cholesterol.in.LDL, "Total.cholesterol.in.LDL.csv")
OT9 <- outcome.test6[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Mean.diameter.for.LDL.particles",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"LDL.D")
Mean.diameter.for.LDL.particles <- OT9[order(OT9$pval), ]
Mean.diameter.for.LDL.particles
write.csv(Mean.diameter.for.LDL.particles, "Mean.diameter.for.LDL.particles.csv")
OT10 <- outcome.test6[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Leucine",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"Leu")
Leucine <- OT10[order(OT10$pval), ]
Leucine
write.csv(Leucine, "Leucine.csv")
#### outcome.test7
OT1 <- outcome.test7[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Total.cholesterol.in.medium.HDL",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"M.HDL.C")
Total.cholesterol.in.medium.HDL <- OT1[order(OT1$pval), ]
Total.cholesterol.in.medium.HDL #### Got one! But in Japanese & Latin American population: 3 snps: IVW =0.019/ML=0.02
write.csv(Total.cholesterol.in.medium.HDL,"Total.cholesterol.in.medium.HDL.csv")
OT2 <- outcome.test7[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Cholesterol.esters.in.medium.HDL",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"M.HDL.CE")
Cholesterol.esters.in.medium.HDL <- OT2[order(OT2$pval), ]
Cholesterol.esters.in.medium.HDL #### Got one! But in Japanese & Latin American population: 3 snps: IVW =0.03/ML=0.04
write.csv(Cholesterol.esters.in.medium.HDL, "Cholesterol.esters.in.medium.HDL.csv")
OT3 <- outcome.test7[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Free.cholesterol.in.medium.HD",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"M.HDL.FC")
Free.cholesterol.in.medium.HDL <- OT3[order(OT3$pval), ]
Free.cholesterol.in.medium.HDL
write.csv(Free.cholesterol.in.medium.HDL, "Free.cholesterol.in.medium.HDL.csv")
OT4 <- outcome.test7[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Total.lipids.in.medium.HDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"M.HDL.L")
Total.lipids.in.medium.HDL <- OT4[order(OT4$pval), ]
Total.lipids.in.medium.HDL
write.csv(Total.lipids.in.medium.HDL, "Total.lipids.in.medium.HDL.csv")
OT5 <- outcome.test7[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Concentration.of.medium.HDL.particles",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"M.HDL.P")
Concentration.of.medium.HDL.particles <- OT5[order(OT5$pval), ]
Concentration.of.medium.HDL.particles
write.csv(Concentration.of.medium.HDL.particles, "Concentration.of.medium.HDL.particles.csv")
OT6 <- outcome.test7[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Phospholipids.in.medium.HDL",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"M.HDL.PL")
Phospholipids.in.medium.HDL <- OT6[order(OT6$pval), ]
Phospholipids.in.medium.HDL
write.csv(Phospholipids.in.medium.HDL, "Phospholipids.in.medium.HDL.csv")
OT7 <- outcome.test7[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Total.cholesterol.in.medium.LDL",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"M.LDL.C")
Total.cholesterol.in.medium.LDL <- OT7[order(OT7$pval), ]
Total.cholesterol.in.medium.LDL
write.csv(Total.cholesterol.in.medium.LDL,"Total.cholesterol.in.medium.LDL.csv")
OT8 <- outcome.test7[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Cholesterol.esters.in.medium.LDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"M.LDL.CE")
Cholesterol.esters.in.medium.LDL <- OT8[order(OT8$pval), ]
Cholesterol.esters.in.medium.LDL
write.csv(Cholesterol.esters.in.medium.LDL, "Cholesterol.esters.in.medium.LDL.csv")
OT9 <- outcome.test7[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Total.lipids.in.medium.LDL",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"M.LDL.L")
Total.lipids.in.medium.LDL <- OT9[order(OT9$pval), ]
Total.lipids.in.medium.LDL
write.csv(Total.lipids.in.medium.LDL, "Total.lipids.in.medium.LDL.csv")
OT10 <- outcome.test7[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Concentration.of.medium.LDL.particles",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"M.LDL.P")
Concentration.of.medium.LDL.particles <- OT10[order(OT10$pval), ]
Concentration.of.medium.LDL.particles
write.csv(Concentration.of.medium.LDL.particles, "Concentration.of.medium.LDL.particles.csv")
#### outcome.test8
OT1 <- outcome.test8[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Phospholipids.in.medium.LDL",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"M.LDL.PL")
Phospholipids.in.medium.LDL <- OT1[order(OT1$pval), ]
Phospholipids.in.medium.LDL
write.csv(Phospholipids.in.medium.LDL, "Phospholipids.in.medium.LDL.csv")
OT2 <- outcome.test8[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Total.cholesterol.in.medium.VLDL",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"M.VLDL.C")
Total.cholesterol.in.medium.VLDL <- OT2[order(OT2$pval), ]
Total.cholesterol.in.medium.VLDL
write.csv(Total.cholesterol.in.medium.VLDL, "Total.cholesterol.in.medium.VLDL.csv")
OT3 <- outcome.test8[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Cholesterol.esters.in.medium.VLDL",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"M.VLDL.CE")
Cholesterol.esters.in.medium.VLDL <- OT3[order(OT3$pval), ]
Cholesterol.esters.in.medium.VLDL
write.csv(Cholesterol.esters.in.medium.VLDL,"Cholesterol.esters.in.medium.VLDL.csv")
OT4 <- outcome.test8[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Free.cholesterol.in.medium.VLDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"M.VLDL.FC")
Free.cholesterol.in.medium.VLDL <- OT4[order(OT4$pval), ]
Free.cholesterol.in.medium.VLDL
write.csv(Free.cholesterol.in.medium.VLDL,"Free.cholesterol.in.medium.VLDL.csv")
OT5 <- outcome.test8[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Total.lipids.in.medium.VLDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"M.VLDL.L")
Total.lipids.in.medium.VLDL <- OT5[order(OT5$pval), ]
Total.lipids.in.medium.VLDL
write.csv(Total.lipids.in.medium.VLDL, "Total.lipids.in.medium.VLDL.csv")
OT6 <- outcome.test8[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Concentration.of.medium.VLDL.particle",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"M.VLDL.P")
Concentration.of.medium.VLDL.particle <- OT6[order(OT6$pval), ]
Concentration.of.medium.VLDL.particle
write.csv(Concentration.of.medium.VLDL.particle, "Concentration.of.medium.VLDL.particle.csv")
OT7 <- outcome.test8[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Phospholipids.in.medium.VLDL",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"M.VLDL.PL")
Phospholipids.in.medium.VLDL <- OT7[order(OT7$pval), ]
Phospholipids.in.medium.VLDL
write.csv(Phospholipids.in.medium.VLDL, "Phospholipids.in.medium.VLDL.csv")
OT8 <- outcome.test8[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Triglycerides.in.medium.VLDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"M.VLDL.TG")
Triglycerides.in.medium.VLDL <- OT8[order(OT8$pval), ]
Triglycerides.in.medium.VLDL
write.csv(Triglycerides.in.medium.VLDL, "Triglycerides.in.medium.VLDL.csv")
OT9 <- outcome.test8[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Mono.unsaturated.fatty.acids",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"MUFA")
Mono.unsaturated.fatty.acids <- OT9[order(OT9$pval), ]
Mono.unsaturated.fatty.acids
write.csv(Mono.unsaturated.fatty.acids, "Mono.unsaturated.fatty.acids.csv")
OT10 <- outcome.test8[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Other.polyunsaturated.fatty.acids.than.18.2",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"UNK.Other.polyunsaturated.fatty.acids.than.18.2")
Other.polyunsaturated.fatty.acids.than.18.2 <- OT10[order(OT10$pval), ]
Other.polyunsaturated.fatty.acids.than.18.2
write.csv(Other.polyunsaturated.fatty.acids.than.18.2, "Other.polyunsaturated.fatty.acids.than.18.2.csv")
#### outcome.test9
OT1 <- outcome.test9[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Phosphatidylcholine.and.other.cholines",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"PC")
Phosphatidylcholine.and.other.cholines <- OT1[order(OT1$pval), ]
Phosphatidylcholine.and.other.cholines
write.csv(Phosphatidylcholine.and.other.cholines, "Phosphatidylcholine.and.other.cholines.csv")
OT2 <- outcome.test9[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Phenylalanine",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"Phe")
Phenylalanine <- OT2[order(OT2$pval), ]
Phenylalanine
write.csv(Phenylalanine, "Phenylalanine.csv")
OT3 <- outcome.test9[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Pyruvate",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"Pyr")
Pyruvate <- OT3[order(OT3$pval), ]
Pyruvate
write.csv(Pyruvate, "Pyruvate.csv")
OT4 <- outcome.test9[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Total.lipids.in.small.HDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"S.HDL.L")
Total.lipids.in.small.HDL <- OT4[order(OT4$pval), ]
Total.lipids.in.small.HDL
write.csv(Total.lipids.in.small.HDL, "Total.lipids.in.small.HDL.csv")
OT5 <- outcome.test9[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Concentration.of.small.HDL.particles",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"S.HDL.P")
Concentration.of.small.HDL.particles <- OT5[order(OT5$pval), ]
Concentration.of.small.HDL.particles
write.csv(Concentration.of.small.HDL.particles, "Concentration.of.small.HDL.particles.csv")
OT6 <- outcome.test9[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Triglycerides.in.small.HDL",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"S.HDL.TG")
Triglycerides.in.small.HDL <- OT6[order(OT6$pval), ]
Triglycerides.in.small.HDL
OT7 <- outcome.test9[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Total.cholesterol.in.small.LDL",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"S.LDL.C")
Total.cholesterol.in.small.LDL <- OT7[order(OT7$pval), ]
Total.cholesterol.in.small.LDL
write.csv(Total.cholesterol.in.small.LDL, "Total.cholesterol.in.small.LDL.csv")
OT8 <- outcome.test9[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Total.lipids.in.small.LDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"S.LDL.L")
Total.lipids.in.small.LDL <- OT8[order(OT8$pval), ]
Total.lipids.in.small.LDL
write.csv(Total.lipids.in.small.LDL, "Total.lipids.in.small.LDL.csv")
OT9 <- outcome.test9[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Concentration.of.small.LDL.particles",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"S.LDL.P")
Concentration.of.small.LDL.particles <- OT9[order(OT9$pval), ]
Concentration.of.small.LDL.particles
write.csv(Concentration.of.small.LDL.particles, "Concentration.of.small.LDL.particles.csv")
OT10 <- outcome.test9[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Total.cholesterol.in.small.VLDL",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"S.VLDL.C")
Total.cholesterol.in.small.VLDL <- OT10[order(OT10$pval), ]
Total.cholesterol.in.small.VLDL
write.csv(Total.cholesterol.in.small.VLDL, "Total.cholesterol.in.small.VLDL.csv")
#### outcome.test10
OT1 <- outcome.test10[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Free.cholesterol.in.small.VLDL",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"S.VLDL.FC")
Free.cholesterol.in.small.VLDL <- OT1[order(OT1$pval), ]
Free.cholesterol.in.small.VLDL
write.csv(Free.cholesterol.in.small.VLDL, "Free.cholesterol.in.small.VLDL.csv")
OT2 <- outcome.test10[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Total.lipids.in.small.VLDL",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"S.VLDL.L")
Total.lipids.in.small.VLDL <- OT2[order(OT2$pval), ]
Total.lipids.in.small.VLDL
write.csv(Total.lipids.in.small.VLDL, "Total.lipids.in.small.VLDL.csv")
OT3 <- outcome.test10[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Concentration.of.small.VLDL.particles",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"S.VLDL.P")
Total.lipids.in.small.VLDL <- OT3[order(OT3$pval), ]
Concentration.of.small.VLDL.particles <- OT3[order(OT3$pval), ]
Concentration.of.small.VLDL.particles
write.csv(Concentration.of.small.VLDL.particles, "Concentration.of.small.VLDL.particles.csv")
OT4 <- outcome.test10[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Concentration.of.small.VLDL.particles",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"S.VLDL.PL")
Total.lipids.in.small.VLDL <- OT4[order(OT4$pval), ]
Concentration.of.small.VLDL.particles <- OT4[order(OT4$pval), ]
Phospholipids.in.small.VLDL <- OT4[order(OT4$pval), ]
Phospholipids.in.small.VLDL
write.csv(Phospholipids.in.small.VLDL, "Phospholipids.in.small.VLDL.csv")
OT5 <- outcome.test10[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Triglycerides.in.small.VLDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"S.VLDL.TG")
Triglycerides.in.small.VLDL <- OT5[order(OT5$pval), ]
Triglycerides.in.small.VLDL
write.csv(Triglycerides.in.small.VLDL, "Triglycerides.in.small.VLDL.csv")
OT6 <- outcome.test10[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Serum.total.cholesterol",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"Serum.C")
Triglycerides.in.small.VLDL <- OT6[order(OT6$pval), ]
Serum.total.cholesterol <- OT6[order(OT6$pval), ]
Serum.total.cholesterol
write.csv(Serum.total.cholesterol, "Serum.total.cholesterol.csv")
OT7 <- outcome.test10[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Serum.total.triglycerides",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"Serum.TG")
Triglycerides.in.small.VLDL <- OT7[order(OT7$pval), ]
Serum.total.cholesterol <- OT7[order(OT7$pval), ]
Serum.total.triglycerides <- OT7[order(OT7$pval), ]
Serum.total.triglycerides
write.csv(Serum.total.triglycerides, "Serum.total.triglycerides.csv")
OT8 <- outcome.test10[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Sphingomyelins",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"SM")
Triglycerides.in.small.VLDL <- OT8[order(OT8$pval), ]
Sphingomyelins <- OT8[order(OT8$pval), ]
Sphingomyelins
write.csv(Sphingomyelins, "Sphingomyelins.csv")
OT9 <- outcome.test10[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Total.fatty.acids",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"TotFA")
Total.fatty.acids <- OT9[order(OT9$pval), ]
Total.fatty.acids <- OT9[order(OT9$pval), ]
Total.fatty.acids
write.csv(Total.fatty.acids, "Total.fatty.acids.csv")
OT10 <- outcome.test10[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"phosphoglycerides", "phosphoglycerides")
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"TG.PG")
phosphoglycerides <- OT10[order(OT10$pval), ]
phosphoglycerides
write.csv(phosphoglycerides, "phosphoglycerides.csv")
#### outcome.test11
OT1 <- outcome.test11[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <-0
OT1$Name <- ifelse(OT1$Name==0,"Tyrosine",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"Tyr")
Tyrosine <- OT1[order(OT1$pval), ]
Tyrosine
write.csv(Tyrosine, "Tyrosine.csv")
OT2 <- outcome.test11[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Urea",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"UNK.Urea")
Urea <- OT2[order(OT2$pval), ]
Urea
write.csv(Urea, "Urea.csv")
OT3 <- outcome.test11[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <-0
OT3$Name <- ifelse(OT3$Name==0,"Valine",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"Val")
Valine <- OT3[order(OT3$pval), ]
Valine
write.csv(Valine, "Valine.csv")
OT4 <- outcome.test11[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Mean.diameter.for.VLDL.particles ",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"VLDL.D")
Mean.diameter.for.VLDL.particles <- OT4[order(OT4$pval), ]
Mean.diameter.for.VLDL.particles
write.csv(Mean.diameter.for.VLDL.particles, "Mean.diameter.for.VLDL.particles.csv")
OT5 <- outcome.test11[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <-0
OT5$Name <- ifelse(OT5$Name==0,"Total.cholesterol.in.very.large.HDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"XL.HDL.C")
Mean.diameter.for.VLDL.particles <- OT5[order(OT5$pval), ]
Total.cholesterol.in.very.large.HDL <- OT5[order(OT5$pval), ]
Total.cholesterol.in.very.large.HDL
write.csv(Total.cholesterol.in.very.large.HDL, "Total.cholesterol.in.very.large.HDL.csv")
OT6 <- outcome.test11[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <-0
OT6$Name <- ifelse(OT6$Name==0,"Cholesterol.esters.in.very.large.HDLL",OT6$Name)
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"XL.HDL.CE")
Cholesterol.esters.in.very.large.HDL <- OT6[order(OT6$pval), ]
Cholesterol.esters.in.very.large.HDL
write.csv(Cholesterol.esters.in.very.large.HDL, "Cholesterol.esters.in.very.large.HDL.csv")
OT7 <- outcome.test11[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <-0
OT7$Name <- ifelse(OT7$Name==0,"Total.cholesterol.in.very.large.HDL",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"XL.HDL.FC")
Free.cholesterol.in.very.large.HDL <- OT7[order(OT7$pval), ]
Free.cholesterol.in.very.large.HDL
write.csv(Free.cholesterol.in.very.large.HDL, "Free.cholesterol.in.very.large.HDL.csv")
OT8 <- outcome.test11[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <-0
OT8$Name <- ifelse(OT8$Name==0,"Total.cholesterol.in.very.large.HDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"XL.HDL.L")
Total.lipids.in.very.large.HDL <- OT8[order(OT8$pval), ]
Total.lipids.in.very.large.HDL
write.csv(Total.lipids.in.very.large.HDL, "Total.lipids.in.very.large.HDL.csv")
OT9 <- outcome.test11[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Concentration.of.very.large.HDL.particles",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"XL.HDL.PL")
Concentration.of.very.large.HDL.particles <- OT9[order(OT9$pval), ]
Concentration.of.very.large.HDL.particles
write.csv(Concentration.of.very.large.HDL.particles, "Concentration.of.very.large.HDL.particles.csv")
OT10 <- outcome.test11[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Phospholipids.in.very.large.HDL",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"XL.HDL.PL")
Concentration.of.very.large.HDL.particles <- OT10[order(OT10$pval), ]
Phospholipids.in.very.large.HDL <- OT10[order(OT10$pval), ]
Phospholipids.in.very.large.HDL
write.csv(Phospholipids.in.very.large.HDL, "Phospholipids.in.very.large.HDL.csv")
#### outcome.test12
OT1 <- outcome.test12[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Triglycerides.in.very.large.HDL",OT1$Name)
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"XL.VLDL.TG")
Triglycerides.in.very.large.HDL <- OT1[order(OT1$pval), ]
write.csv(Triglycerides.in.very.large.HDL, "Triglycerides.in.very.large.HDL.csv")
OT2 <- outcome.test12[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Total.lipids.in.very.large.VLDL",OT2$Name)
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"XL.VLDL.L")
Total.lipids.in.very.large.VLDL <- OT2[order(OT2$pval), ]
Total.lipids.in.very.large.VLDL
write.csv(Total.lipids.in.very.large.VLDL, "Total.lipids.in.very.large.VLDL.csv")
OT3 <- outcome.test12[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Concentration.of.very.large.VLDL.particles",OT3$Name)
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"XL.VLDL.P")
Concentration.of.very.large.VLDL.particles <- OT3[order(OT3$pval), ]
Concentration.of.very.large.VLDL.particles
write.csv(Concentration.of.very.large.VLDL.particles, "Concentration.of.very.large.VLDL.particles.csv")
OT4 <- outcome.test12[,4]
OT4 <- OT4[[1]]
OT4 <- as.data.frame(OT4)
OT4
OT4$Name <- 0
OT4$Name <- ifelse(OT4$Name==0,"Phospholipids.in.very.large.VLDL",OT4$Name)
OT4$Metabolite <- 0
OT4$Metabolite <- ifelse(OT4$Metabolite==0,"XL.VLDL.PL")
Phospholipids.in.very.large.VLDL <- OT4[order(OT4$pval), ]
Phospholipids.in.very.large.VLDL
write.csv(Phospholipids.in.very.large.VLDL, "Phospholipids.in.very.large.VLDL.csv")
OT5 <- outcome.test12[,5]
OT5 <- OT5[[1]]
OT5 <- as.data.frame(OT5)
OT5
OT5$Name <- 0
OT5$Name <- ifelse(OT5$Name==0,"Triglycerides.in.very.large.VLDL",OT5$Name)
OT5$Metabolite <- 0
OT5$Metabolite <- ifelse(OT5$Metabolite==0,"XL.VLDL.TG")
Phospholipids.in.very.large.VLDL <- OT5[order(OT5$pval), ]
Triglycerides.in.very.large.VLDL <- OT5[order(OT5$pval), ]
Triglycerides.in.very.large.VLDL
write.csv(Triglycerides.in.very.large.VLDL, "Triglycerides.in.very.large.VLDL.csv")
OT6 <- outcome.test12[,6]
OT6 <- OT6[[1]]
OT6 <- as.data.frame(OT6)
OT6
OT6$Name <- 0
OT6$Name <- ifelse(OT6$Name==0,"Total.lipids.in.very.small.VLDL")
OT6$Metabolite <- 0
OT6$Metabolite <- ifelse(OT6$Metabolite==0,"XS.VLDL.L")
Total.lipids.in.very.small.VLDL <- OT6[order(OT6$pval), ]
Total.lipids.in.very.small.VLDL
write.csv(Total.lipids.in.very.small.VLDL, "Total.lipids.in.very.small.VLDL.csv")
OT7 <- outcome.test12[,7]
OT7 <- OT7[[1]]
OT7 <- as.data.frame(OT7)
OT7
OT7$Name <- 0
OT7$Name <- ifelse(OT7$Name==0,"Concentration.of.very.small.VLDL.particles",OT7$Name)
OT7$Metabolite <- 0
OT7$Metabolite <- ifelse(OT7$Metabolite==0,"XS.VLDL.P")
Total.lipids.in.very.small.VLDL <- OT7[order(OT7$pval), ]
Concentration.of.very.small.VLDL.particles <- OT7[order(OT7$pval), ]
Concentration.of.very.small.VLDL.particles
write.csv(Concentration.of.very.small.VLDL.particles, "Concentration.of.very.small.VLDL.particles.csv")
OT8 <- outcome.test12[,8]
OT8 <- OT8[[1]]
OT8 <- as.data.frame(OT8)
OT8
OT8$Name <- 0
OT8$Name <- ifelse(OT8$Name==0,"Phospholipids.in.very.small.VLDL",OT8$Name)
OT8$Metabolite <- 0
OT8$Metabolite <- ifelse(OT8$Metabolite==0,"XS.VLDL.PL")
Phospholipids.in.very.small.VLDL <- OT8[order(OT8$pval), ]
Phospholipids.in.very.small.VLDL
OT9 <- outcome.test12[,9]
OT9 <- OT9[[1]]
OT9 <- as.data.frame(OT9)
OT9
OT9$Name <- 0
OT9$Name <- ifelse(OT9$Name==0,"Triglycerides.in.very.small.VLDL",OT9$Name)
OT9$Metabolite <- 0
OT9$Metabolite <- ifelse(OT9$Metabolite==0,"XS.VLDL.TG", OT9$Name)
Triglycerides.in.very.small.VLDL <- OT9[order(OT9$pval), ]
Triglycerides.in.very.small.VLDL
write.csv(Triglycerides.in.very.small.VLDL, "Triglycerides.in.very.small.VLDL.csv")
OT10 <- outcome.test12[,10]
OT10 <- OT10[[1]]
OT10 <- as.data.frame(OT10)
OT10
OT10$Name <- 0
OT10$Name <- ifelse(OT10$Name==0,"Total.lipids.in.chylomicrons.and.largest.VLDL.particles",OT10$Name)
OT10$Metabolite <- 0
OT10$Metabolite <- ifelse(OT10$Metabolite==0,"XXL.VLDL.L", OT10$Name)
Total.lipids.in.chylomicrons.and.largest.VLDL.particles <- OT10[order(OT10$pval), ]
Total.lipids.in.chylomicrons.and.largest.VLDL.particles
write.csv(Total.lipids.in.chylomicrons.and.largest.VLDL.particles, "Total.lipids.in.chylomicrons.and.largest.VLDL.particles.csv")
#### outcome.test13
OT1 <- outcome.test13[,1]
OT1 <- OT1[[1]]
OT1 <- as.data.frame(OT1)
OT1
OT1$Name <- 0
OT1$Name <- ifelse(OT1$Name==0,"Concentration.of.chylomicrons.and.largest.VLDL.particles")
OT1$Metabolite <- 0
OT1$Metabolite <- ifelse(OT1$Metabolite==0,"XXL.VLDL.P")
Concentration.of.chylomicrons.and.largest.VLDL.particles <- OT1[order(OT1$pval), ]
Concentration.of.chylomicrons.and.largest.VLDL.particles
write.csv(Concentration.of.chylomicrons.and.largest.VLDL.particles, "Concentration.of.chylomicrons.and.largest.VLDL.particles.csv")
OT2 <- outcome.test13[,2]
OT2 <- OT2[[1]]
OT2 <- as.data.frame(OT2)
OT2
OT2$Name <- 0
OT2$Name <- ifelse(OT2$Name==0,"Total.lipids.in.chylomicrons.and.largest.VLDL.particles")
OT2$Metabolite <- 0
OT2$Metabolite <- ifelse(OT2$Metabolite==0,"XXL.VLDL.P")
Phospholipids.in.chylomicrons.and.largest.VLDL.particles <- OT2[order(OT2$pval), ]
Phospholipids.in.chylomicrons.and.largest.VLDL.particles
write.csv(Phospholipids.in.chylomicrons.and.largest.VLDL.particles, "Phospholipids.in.chylomicrons.and.largest.VLDL.particles.csv")
OT3 <- outcome.test13[,3]
OT3 <- OT3[[1]]
OT3 <- as.data.frame(OT3)
OT3
OT3$Name <- 0
OT3$Name <- ifelse(OT3$Name==0,"Triglycerides.in.chylomicrons.and.largest.VLDL.particles")
OT3$Metabolite <- 0
OT3$Metabolite <- ifelse(OT3$Metabolite==0,"XXL.VLDL.TG")
Triglycerides.in.chylomicrons.and.largest.VLDL.particles <- OT3[order(OT3$pval), ]
Triglycerides.in.chylomicrons.and.largest.VLDL.particles
write.csv(Triglycerides.in.chylomicrons.and.largest.VLDL.particles, "Triglycerides.in.chylomicrons.and.largest.VLDL.particles.csv")