All public logs

Jump to navigation Jump to search

Combined display of all available logs of 太極. You can narrow down the view by selecting a log type, the username (case-sensitive), or the affected page (also case-sensitive).

Logs
(newest | oldest) View ( | ) (20 | 50 | 100 | 250 | 500)
  • 22:26, 14 January 2023 Brb talk contribs created page File:RbdGeom.png (<pre> require(ggplot2) aggregate( .~ treatment +block,FUN=median, data = data) |> ggplot(aes(treatment, yield)) + geom_line(aes(group = block, color = block), linewidth = 1.2) + geom_point(aes(color = block), shape = 15, size=2.6) </pre>)
  • 22:26, 14 January 2023 Brb talk contribs uploaded File:RbdGeom.png (<pre> require(ggplot2) aggregate( .~ treatment +block,FUN=median, data = data) |> ggplot(aes(treatment, yield)) + geom_line(aes(group = block, color = block), linewidth = 1.2) + geom_point(aes(color = block), shape = 15, size=2.6) </pre>)
  • 21:51, 14 January 2023 Brb talk contribs created page File:RbdBlock.png (<pre> set.seed(1234) block <- as.factor(rep(1:5, each=6)) treatment <- rep(c("A","B","C"),5) block_shift <- rnorm(5, mean = 0, sd = 2) treatment_shift <- c(A=0, B=4, C=2) random_effect <- rnorm(30, mean = 0, sd = 1) yield <- rnorm(30, mean = 10, sd = 2) + treatment_shift[as.integer(factor(treatment))] + block_shift[as.numeric(block)] + random_effect data <- data.frame(block, treatment, yield) summary(fm1 <- aov(yield ~ treatment + block, data = data)) # Df Sum Sq Mean Sq...)
  • 21:51, 14 January 2023 Brb talk contribs uploaded File:RbdBlock.png (<pre> set.seed(1234) block <- as.factor(rep(1:5, each=6)) treatment <- rep(c("A","B","C"),5) block_shift <- rnorm(5, mean = 0, sd = 2) treatment_shift <- c(A=0, B=4, C=2) random_effect <- rnorm(30, mean = 0, sd = 1) yield <- rnorm(30, mean = 10, sd = 2) + treatment_shift[as.integer(factor(treatment))] + block_shift[as.numeric(block)] + random_effect data <- data.frame(block, treatment, yield) summary(fm1 <- aov(yield ~ treatment + block, data = data)) # Df Sum Sq Mean Sq...)
  • 21:50, 14 January 2023 Brb talk contribs created page File:RbdTreat.png (<pre> set.seed(1234) block <- as.factor(rep(1:5, each=6)) treatment <- rep(c("A","B","C"),5) block_shift <- rnorm(5, mean = 0, sd = 2) treatment_shift <- c(A=0, B=4, C=2) random_effect <- rnorm(30, mean = 0, sd = 1) yield <- rnorm(30, mean = 10, sd = 2) + treatment_shift[as.integer(factor(treatment))] + block_shift[as.numeric(block)] + random_effect data <- data.frame(block, treatment, yield) summary(fm1 <- aov(yield ~ treatment + block, data = data)) # Df Sum Sq Mean Sq...)
  • 21:50, 14 January 2023 Brb talk contribs uploaded File:RbdTreat.png (<pre> set.seed(1234) block <- as.factor(rep(1:5, each=6)) treatment <- rep(c("A","B","C"),5) block_shift <- rnorm(5, mean = 0, sd = 2) treatment_shift <- c(A=0, B=4, C=2) random_effect <- rnorm(30, mean = 0, sd = 1) yield <- rnorm(30, mean = 10, sd = 2) + treatment_shift[as.integer(factor(treatment))] + block_shift[as.numeric(block)] + random_effect data <- data.frame(block, treatment, yield) summary(fm1 <- aov(yield ~ treatment + block, data = data)) # Df Sum Sq Mean Sq...)
  • 12:18, 12 January 2023 Brb talk contribs created page File:GseaTable2.png (An example of a plot from 10 non-enriched pathways. <pre> data(examplePathways) data(exampleRanks) fgseaRes <- fgsea(examplePathways, exampleRanks, nperm=1000, minSize=15, maxSize=100) fgseaRes[order(pval, decreasing = T),][1:10, c('NES', 'pval')] # NES pval # 1: -0.4050950 1.0000000 # 2: -0.4050950 1.0000000 # 3: -0.4966664 0.9932584 # 4: 0.4804114 0.9870610 # 5: 0.4804114 0.9870610 # 6: 0.4804114 0.9870610 # 7: 0.4804114 0.9870610 # 8: 0.4955139 0.9854...)
  • 12:18, 12 January 2023 Brb talk contribs uploaded File:GseaTable2.png (An example of a plot from 10 non-enriched pathways. <pre> data(examplePathways) data(exampleRanks) fgseaRes <- fgsea(examplePathways, exampleRanks, nperm=1000, minSize=15, maxSize=100) fgseaRes[order(pval, decreasing = T),][1:10, c('NES', 'pval')] # NES pval # 1: -0.4050950 1.0000000 # 2: -0.4050950 1.0000000 # 3: -0.4966664 0.9932584 # 4: 0.4804114 0.9870610 # 5: 0.4804114 0.9870610 # 6: 0.4804114 0.9870610 # 7: 0.4804114 0.9870610 # 8: 0.4955139 0.9854...)
  • 12:01, 12 January 2023 Brb talk contribs created page File:GseaTable.png (<pre> data(examplePathways) data(exampleRanks) fgseaRes <- fgsea(examplePathways, exampleRanks, nperm=1000, minSize=15, maxSize=100) # I pick 5 pathways with + NES and 5 pathways with - NES. fgseaRes[order(pval), ][62:71, c('pathway', 'NES')] # pathway NES # 1: 5992282_ECM_proteoglycans 1.984081 # 2: 5992219_Regulation_of_cholesterol_biosynthesis_by_SREBP_SREBF_ 1.95...)
  • 12:01, 12 January 2023 Brb talk contribs uploaded File:GseaTable.png (<pre> data(examplePathways) data(exampleRanks) fgseaRes <- fgsea(examplePathways, exampleRanks, nperm=1000, minSize=15, maxSize=100) # I pick 5 pathways with + NES and 5 pathways with - NES. fgseaRes[order(pval), ][62:71, c('pathway', 'NES')] # pathway NES # 1: 5992282_ECM_proteoglycans 1.984081 # 2: 5992219_Regulation_of_cholesterol_biosynthesis_by_SREBP_SREBF_ 1.95...)
  • 12:15, 8 January 2023 Brb talk contribs created page File:Reorder.dendrogram.png (<pre> set.seed(123) x <- rnorm(20) hc <- hclust(dist(x)) dd <- as.dendrogram(hc) par(mfrow=c(3, 1)) plot(dd, main = "random dendrogram 'dd'") # not the same as reorder(dd, 1:20) plot(reorder(dd, 20:1), main = 'reorder(dd, 20:1, sum)') plot(reorder(dd, 20:1, mean), main = 'reorder(dd, 20:1, mean)') </pre>)
  • 12:15, 8 January 2023 Brb talk contribs uploaded File:Reorder.dendrogram.png (<pre> set.seed(123) x <- rnorm(20) hc <- hclust(dist(x)) dd <- as.dendrogram(hc) par(mfrow=c(3, 1)) plot(dd, main = "random dendrogram 'dd'") # not the same as reorder(dd, 1:20) plot(reorder(dd, 20:1), main = 'reorder(dd, 20:1, sum)') plot(reorder(dd, 20:1, mean), main = 'reorder(dd, 20:1, mean)') </pre>)
  • 21:37, 7 January 2023 Brb talk contribs created page File:ComplexHeatmap2.png (<syntaxhighlight lang="rsplus"> # Simulate data library(ComplexHeatmap) ng <- 30; ns <- 20 set.seed(1) mat <- matrix(rnorm(ng*ns), nr=ng, nc=ns) colnames(mat) <- 1:ns rownames(mat) <- 1:ng # color bar on RHS ind_e <- 1:round(ng/3) ind_m <- (1+round(ng/3)):ng epimes <- rep(c("epi", "mes"), c(length(ind_e), length(ind_m))) row_ha <- rowAnnotation(epimes = epimes, col = list(epimes = c("epi" = "orange", "mes" = "darkgreen"))) # color bar on Top tumortype <- rep(c("carcinoma", "sarcoma"...)
  • 21:37, 7 January 2023 Brb talk contribs uploaded File:ComplexHeatmap2.png (<syntaxhighlight lang="rsplus"> # Simulate data library(ComplexHeatmap) ng <- 30; ns <- 20 set.seed(1) mat <- matrix(rnorm(ng*ns), nr=ng, nc=ns) colnames(mat) <- 1:ns rownames(mat) <- 1:ng # color bar on RHS ind_e <- 1:round(ng/3) ind_m <- (1+round(ng/3)):ng epimes <- rep(c("epi", "mes"), c(length(ind_e), length(ind_m))) row_ha <- rowAnnotation(epimes = epimes, col = list(epimes = c("epi" = "orange", "mes" = "darkgreen"))) # color bar on Top tumortype <- rep(c("carcinoma", "sarcoma"...)
  • 12:37, 6 January 2023 Brb talk contribs created page File:Fgsea3plots.png (<pre> par(mfrow=c(1,3)) with(fgseaRes, plot(abs(ES), pval)) with(fgseaRes, plot(abs(NES), pval)) with(fgseaRes, plot(ES, NES)) </pre>)
  • 12:37, 6 January 2023 Brb talk contribs uploaded File:Fgsea3plots.png (<pre> par(mfrow=c(1,3)) with(fgseaRes, plot(abs(ES), pval)) with(fgseaRes, plot(abs(NES), pval)) with(fgseaRes, plot(ES, NES)) </pre>)
  • 14:58, 31 December 2022 Brb talk contribs created page File:Filebrowser.png
  • 14:58, 31 December 2022 Brb talk contribs uploaded File:Filebrowser.png
  • 20:07, 25 December 2022 Brb talk contribs created page File:DisableDropbox4pm.png
  • 20:07, 25 December 2022 Brb talk contribs uploaded File:DisableDropbox4pm.png
  • 15:40, 15 December 2022 Brb talk contribs created page File:Geom smooth ex.png (<pre> library(dplyr) #group the data by cyl and create the plots mpg %>% group_by(cyl) %>% ggplot(aes(x=displ, y=hwy, color=factor(cyl))) + geom_point() + geom_smooth(method = "lm", se = FALSE) + theme(legend.position="none") </pre>)
  • 15:40, 15 December 2022 Brb talk contribs uploaded File:Geom smooth ex.png (<pre> library(dplyr) #group the data by cyl and create the plots mpg %>% group_by(cyl) %>% ggplot(aes(x=displ, y=hwy, color=factor(cyl))) + geom_point() + geom_smooth(method = "lm", se = FALSE) + theme(legend.position="none") </pre>)
  • 15:14, 15 December 2022 Brb talk contribs created page File:Geom bar4.png (<pre> ggplot(mpg, aes(x = class)) + geom_vline(xintercept = mpg$class, color = "grey", linetype = "dashed", size = 1) + geom_bar() + theme_classic() + coord_flip() </pre>)
  • 15:14, 15 December 2022 Brb talk contribs uploaded File:Geom bar4.png (<pre> ggplot(mpg, aes(x = class)) + geom_vline(xintercept = mpg$class, color = "grey", linetype = "dashed", size = 1) + geom_bar() + theme_classic() + coord_flip() </pre>)
  • 15:08, 15 December 2022 Brb talk contribs created page File:Geom bar3.png (<pre> ggplot(mpg, aes(x=manufacturer)) + geom_bar() + theme(panel.grid.major.x = element_blank(), panel.grid.minor = element_blank()) </pre>)
  • 15:08, 15 December 2022 Brb talk contribs uploaded File:Geom bar3.png (<pre> ggplot(mpg, aes(x=manufacturer)) + geom_bar() + theme(panel.grid.major.x = element_blank(), panel.grid.minor = element_blank()) </pre>)
  • 14:41, 15 December 2022 Brb talk contribs created page File:Geom bar2.png (<pre> library(ggplot2) library(scales) library(patchwork) dtf <- data.frame(x = c("ETB", "PMA", "PER", "KON", "TRA", "DDR", "BUM", "MAT", "HED", "EXP"), y = c(.02, .11, -.01, -.03, -.03, .02, .1, -.01, -.02, 0.06)) set.seed(1) dtf2 <- data.frame(x = dtf[, 1], y = sample(dtf[, 2])) g1 <- ggplot(dtf, aes(x, y)) + geom_bar(stat = "identity", fill = "#F8767D") + geom_text(aes(label = paste0(y * 100, "%"), hjust = ifelse(y >= 0, 0, 1))) +...)
  • 14:41, 15 December 2022 Brb talk contribs uploaded File:Geom bar2.png (<pre> library(ggplot2) library(scales) library(patchwork) dtf <- data.frame(x = c("ETB", "PMA", "PER", "KON", "TRA", "DDR", "BUM", "MAT", "HED", "EXP"), y = c(.02, .11, -.01, -.03, -.03, .02, .1, -.01, -.02, 0.06)) set.seed(1) dtf2 <- data.frame(x = dtf[, 1], y = sample(dtf[, 2])) g1 <- ggplot(dtf, aes(x, y)) + geom_bar(stat = "identity", fill = "#F8767D") + geom_text(aes(label = paste0(y * 100, "%"), hjust = ifelse(y >= 0, 0, 1))) +...)
  • 14:39, 15 December 2022 Brb talk contribs created page File:Geom bar1.png (<pre> library(ggplot2) library(scales) library(patchwork) dtf <- data.frame(x = c("ETB", "PMA", "PER", "KON", "TRA", "DDR", "BUM", "MAT", "HED", "EXP"), y = c(.02, .11, -.01, -.03, -.03, .02, .1, -.01, -.02, 0.06)) set.seed(1) dtf2 <- data.frame(x = dtf[, 1], y = sample(dtf[, 2])) g1 <- ggplot(dtf, aes(x, y)) + geom_bar(stat = "identity", aes(fill = x)) + geom_text(aes(label = paste0(y * 100, "%"), hjust = ifelse(y >= 0,...)
  • 14:39, 15 December 2022 Brb talk contribs uploaded File:Geom bar1.png (<pre> library(ggplot2) library(scales) library(patchwork) dtf <- data.frame(x = c("ETB", "PMA", "PER", "KON", "TRA", "DDR", "BUM", "MAT", "HED", "EXP"), y = c(.02, .11, -.01, -.03, -.03, .02, .1, -.01, -.02, 0.06)) set.seed(1) dtf2 <- data.frame(x = dtf[, 1], y = sample(dtf[, 2])) g1 <- ggplot(dtf, aes(x, y)) + geom_bar(stat = "identity", aes(fill = x)) + geom_text(aes(label = paste0(y * 100, "%"), hjust = ifelse(y >= 0,...)
  • 18:00, 5 December 2022 Brb talk contribs created page File:GpartedinfoSanDisk.png
  • 18:00, 5 December 2022 Brb talk contribs uploaded File:GpartedinfoSanDisk.png
  • 09:17, 5 November 2022 Brb talk contribs created page Car (Created page with "= General resource = * [https://www.howacarworks.com How a car works] - The ultimate guide to how cars work. * [https://m.wikihow.com/Maintain-a-Car How to Maintain a Car] * [...")
  • 15:55, 29 October 2022 Brb talk contribs created page File:ExampleRanks.png (<pre> plot(exampleRanks) </pre>)
  • 15:55, 29 October 2022 Brb talk contribs uploaded File:ExampleRanks.png (<pre> plot(exampleRanks) </pre>)
  • 15:39, 29 October 2022 Brb talk contribs created page File:FgseaPlotSmallm.png
  • 15:39, 29 October 2022 Brb talk contribs uploaded File:FgseaPlotSmallm.png
  • 15:15, 27 October 2022 Brb talk contribs created page File:DHdialog2.png
  • 15:15, 27 October 2022 Brb talk contribs uploaded File:DHdialog2.png
  • 15:15, 27 October 2022 Brb talk contribs created page File:DHdialog1.png
  • 15:15, 27 October 2022 Brb talk contribs uploaded File:DHdialog1.png
  • 09:46, 27 October 2022 Brb talk contribs created page File:HC single.png
  • 09:46, 27 October 2022 Brb talk contribs uploaded File:HC single.png
  • 20:41, 26 October 2022 Brb talk contribs created page Game (Created page with "= Linux = * [https://itsfoss.com/download-linux-games/ Fantastic Linux Games and Where to Find Them] * [https://www.makeuseof.com/tag/best-linux-games/ The 10 Best Linux Games...")
  • 10:48, 20 October 2022 Brb talk contribs created page File:1NN better NC.png
  • 10:48, 20 October 2022 Brb talk contribs uploaded File:1NN better NC.png
  • 17:26, 19 October 2022 Brb talk contribs created page File:NC better kNN.png (The green color is a new observation (Sensitive). By using the kNN method, it will be assigned to Resistant b/c it is closer to the Resistant group. However, using the NC, the distance of it to the Resistant group centroid is 8.42 which is larger than the distance of it to the Sensitive groups centroid 7.31. So NC classified it to Sensitive. Color annotation: green=LOO obs, black=centroid in each class.)
  • 17:26, 19 October 2022 Brb talk contribs uploaded File:NC better kNN.png (The green color is a new observation (Sensitive). By using the kNN method, it will be assigned to Resistant b/c it is closer to the Resistant group. However, using the NC, the distance of it to the Resistant group centroid is 8.42 which is larger than the distance of it to the Sensitive groups centroid 7.31. So NC classified it to Sensitive. Color annotation: green=LOO obs, black=centroid in each class.)
  • 11:03, 12 October 2022 Brb talk contribs created page File:Foldchangefilter.png (<pre> LFC <- log2(1.5) x <- c(0, 0, 0, 0, 0, 0, 0, 0, 3.22, 0, 0, 0, 8.09, 0, 0.65, 0, 0, 0, 0, 0, 3.38, 0, 5.63, 7.46, 0, 0, 4.38, 0) plot(x, y = 1:28, xlab="log2 intensity", ylab="samples") abline(v=LFC, lty="dashed") axis(side=3,at=LFC, labels="LFC", tick=FALSE, line=0) </pre>)
  • 11:03, 12 October 2022 Brb talk contribs uploaded File:Foldchangefilter.png (<pre> LFC <- log2(1.5) x <- c(0, 0, 0, 0, 0, 0, 0, 0, 3.22, 0, 0, 0, 8.09, 0, 0.65, 0, 0, 0, 0, 0, 3.38, 0, 5.63, 7.46, 0, 0, 4.38, 0) plot(x, y = 1:28, xlab="log2 intensity", ylab="samples") abline(v=LFC, lty="dashed") axis(side=3,at=LFC, labels="LFC", tick=FALSE, line=0) </pre>)
(newest | oldest) View ( | ) (20 | 50 | 100 | 250 | 500)