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).
- 14:02, 23 August 2022 Brb talk contribs created page File:ComplexHeatmap1.png (<pre> library(ComplexHeatmap) set.seed(123) ng <- 10; n <- 10 mat = matrix(rnorm(ng * n), n) rownames(mat) = paste0("R", 1:ng) colnames(mat) = paste0("C", 1:n) bin <- sample(c("resistant", "sensitive"), n, replace = TRUE) tgi <- runif(n) # sort the columns by tgi ord <- order(tgi) col_fun = circlize::colorRamp2(range(tgi), c("#DEEBF7", "#084594")) column_ha = HeatmapAnnotation(tgi = tgi[ord], bin = bin[ord], col = list(tgi = col_fun,...)
- 14:02, 23 August 2022 Brb talk contribs uploaded File:ComplexHeatmap1.png (<pre> library(ComplexHeatmap) set.seed(123) ng <- 10; n <- 10 mat = matrix(rnorm(ng * n), n) rownames(mat) = paste0("R", 1:ng) colnames(mat) = paste0("C", 1:n) bin <- sample(c("resistant", "sensitive"), n, replace = TRUE) tgi <- runif(n) # sort the columns by tgi ord <- order(tgi) col_fun = circlize::colorRamp2(range(tgi), c("#DEEBF7", "#084594")) column_ha = HeatmapAnnotation(tgi = tgi[ord], bin = bin[ord], col = list(tgi = col_fun,...)
- 13:19, 22 August 2022 Brb talk contribs created page File:Doubledip.png (<pre> ng <- 1000 # number of genes ns <- 100 # number of samples k <- 2 # number of groups alpha <- .001 # cutoff of selecting sig genes set.seed(1) x = matrix(rnorm(ng * ns), nr= ns) # samples x features hc = hclust(dist(x)) plot(hc) grp = cutree(hc, k=k) # vector of group membership ex <- t(x) r1 <- genefilter::rowttests(ex, factor(grp)) sum(r1$p.value < alpha) # 2 hist(r1$p.value) i <- which(r1$p.value < alpha) i1 <- i[1] ; i2 <- i[2] plot(x[, i1], x[, i2], col = grp, pch= 16, cex=1...)
- 13:19, 22 August 2022 Brb talk contribs uploaded File:Doubledip.png (<pre> ng <- 1000 # number of genes ns <- 100 # number of samples k <- 2 # number of groups alpha <- .001 # cutoff of selecting sig genes set.seed(1) x = matrix(rnorm(ng * ns), nr= ns) # samples x features hc = hclust(dist(x)) plot(hc) grp = cutree(hc, k=k) # vector of group membership ex <- t(x) r1 <- genefilter::rowttests(ex, factor(grp)) sum(r1$p.value < alpha) # 2 hist(r1$p.value) i <- which(r1$p.value < alpha) i1 <- i[1] ; i2 <- i[2] plot(x[, i1], x[, i2], col = grp, pch= 16, cex=1...)
- 09:21, 10 August 2022 Brb talk contribs created page File:Ruspini.png (library(cluster) # ruspini is 75 x 2 data(ruspini) hc <- hclust(dist(ruspini), "ave"); plot(hc) # si <- silhouette(groups, dist(ruspini)) # plot(si, main = paste("k = ", 4)) op <- par(mfrow= c(3,2), oma= c(0,0, 3, 0), mgp= c(1.6,.8,0), mar= .1+c(4,2,2,2)) plot(hc) for(k in 2:6) { groups<- cutree(hc, k=k) si <- silhouette(groups, dist(ruspini)) plot(si, main = paste("k = ", k)) } par(op))
- 09:21, 10 August 2022 Brb talk contribs uploaded File:Ruspini.png (library(cluster) # ruspini is 75 x 2 data(ruspini) hc <- hclust(dist(ruspini), "ave"); plot(hc) # si <- silhouette(groups, dist(ruspini)) # plot(si, main = paste("k = ", 4)) op <- par(mfrow= c(3,2), oma= c(0,0, 3, 0), mgp= c(1.6,.8,0), mar= .1+c(4,2,2,2)) plot(hc) for(k in 2:6) { groups<- cutree(hc, k=k) si <- silhouette(groups, dist(ruspini)) plot(si, main = paste("k = ", k)) } par(op))
- 18:55, 23 June 2022 Brb talk contribs created page File:Tidyheatmap.png
- 18:55, 23 June 2022 Brb talk contribs uploaded File:Tidyheatmap.png
- 14:22, 21 June 2022 Brb talk contribs created page File:BatchqcPCA.png
- 14:22, 21 June 2022 Brb talk contribs uploaded File:BatchqcPCA.png
- 14:22, 21 June 2022 Brb talk contribs created page File:BatchqcDE.png
- 14:22, 21 June 2022 Brb talk contribs uploaded File:BatchqcDE.png
- 14:21, 21 June 2022 Brb talk contribs created page File:BatchqcVariation.png
- 14:21, 21 June 2022 Brb talk contribs uploaded File:BatchqcVariation.png
- 14:20, 21 June 2022 Brb talk contribs created page File:BatchqcSummary.png
- 14:20, 21 June 2022 Brb talk contribs uploaded File:BatchqcSummary.png
- 19:43, 8 June 2022 Brb talk contribs created page Fstab (Created page with "* man fstab * https://help.ubuntu.com/community/Fstab ** Format: [Device] [Mount Point] [File System Type] [Options] [Dump] [Pass] ** <dump> Enable or disable backing up of th...")
- 17:02, 4 June 2022 Brb talk contribs created page File:Heatmap rdylbu.png
- 17:02, 4 June 2022 Brb talk contribs uploaded File:Heatmap rdylbu.png
- 14:02, 4 June 2022 Brb talk contribs created page Self hosting (Created page with "= Resource = * [https://github.com/mycroftwilde/portainer_templates Helpful Youtube Channels for Self-Hosting] = [http://www.proxmox.com/en/ Proxmox Virtual Environment] = *...")
- 09:06, 27 May 2022 Brb talk contribs created page File:Inter gg2.png
- 09:06, 27 May 2022 Brb talk contribs uploaded File:Inter gg2.png
- 08:51, 27 May 2022 Brb talk contribs created page File:Inter gg.png
- 08:51, 27 May 2022 Brb talk contribs uploaded File:Inter gg.png
- 08:51, 27 May 2022 Brb talk contribs created page File:Inter base.png
- 08:51, 27 May 2022 Brb talk contribs uploaded File:Inter base.png
- 08:16, 27 May 2022 Brb talk contribs uploaded a new version of File:Inter base.svg
- 08:04, 27 May 2022 Brb talk contribs created page File:Inter base.svg
- 08:04, 27 May 2022 Brb talk contribs uploaded File:Inter base.svg
- 09:08, 26 May 2022 Brb talk contribs created page File:LogisticFail.svg (> set.seed(1234); n <- 16; mu=3; x <- c(rnorm(n), rnorm(n, mu)); y <- rep(0:1, each=n) > summary(glm(y ~ x, family = binomial)); plot(x, y))
- 09:08, 26 May 2022 Brb talk contribs uploaded File:LogisticFail.svg (> set.seed(1234); n <- 16; mu=3; x <- c(rnorm(n), rnorm(n, mu)); y <- rep(0:1, each=n) > summary(glm(y ~ x, family = binomial)); plot(x, y))
- 12:35, 16 May 2022 Brb talk contribs created page Batch effect (Created page with "= Merging two gene expression studies, ComBat = * [https://www.coursera.org/lecture/statistical-genomics/module-2-overview-1-12-cbqYZ Statistics for Genomic Data Science] (Cou...")
- 11:56, 10 May 2022 Brb talk contribs created page File:ColorRampBlueRed.png
- 11:56, 10 May 2022 Brb talk contribs uploaded File:ColorRampBlueRed.png
- 08:34, 30 April 2022 Brb talk contribs created page Docker Applications (Created page with "[https://kuonsam.miraheze.org/wiki/Setting_Up_a_Docker_Server#Install_Docker-compose Setting Up a Docker Server] (host OS is CentOS) = Dockerizing Compiled Software = https:/...")
- 18:39, 24 March 2022 Brb talk contribs created page File:Rerrorbars.png (<pre> library(ggplot2) df <- ToothGrowth df$dosef <- as.factor(df$dose) library(dplyr) df.summary <- df %>% group_by(dosef) %>% summarise( sd = sd(len, na.rm = TRUE), len = mean(len) ) df.summary p1 <- ggplot(df, aes(dosef, len)) + geom_jitter(position = position_jitter(0.2, seed=1), color = "darkgray") + geom_point(aes(x=dosef, y=len), shape="+", size=8, data=df.summary) + geom_errorbar(aes(ymin = len-sd, ymax = len+sd), width=.2, data = df.summary) df.summary$dose <...)
- 18:39, 24 March 2022 Brb talk contribs uploaded File:Rerrorbars.png (<pre> library(ggplot2) df <- ToothGrowth df$dosef <- as.factor(df$dose) library(dplyr) df.summary <- df %>% group_by(dosef) %>% summarise( sd = sd(len, na.rm = TRUE), len = mean(len) ) df.summary p1 <- ggplot(df, aes(dosef, len)) + geom_jitter(position = position_jitter(0.2, seed=1), color = "darkgray") + geom_point(aes(x=dosef, y=len), shape="+", size=8, data=df.summary) + geom_errorbar(aes(ymin = len-sd, ymax = len+sd), width=.2, data = df.summary) df.summary$dose <...)
- 18:37, 24 March 2022 Brb talk contribs created page File:Rerrorbar.svg (<pre> library(ggplot2) df <- ToothGrowth df$dosef <- as.factor(df$dose) library(dplyr) df.summary <- df %>% group_by(dosef) %>% summarise( sd = sd(len, na.rm = TRUE), len = mean(len) ) df.summary p1 <- ggplot(df, aes(dosef, len)) + geom_jitter(position = position_jitter(0.2, seed=1), color = "darkgray") + geom_point(aes(x=dosef, y=len), shape="+", size=8, data=df.summary) + geom_errorbar(aes(ymin = len-sd, ymax = len+sd), width=.2, data = df.summary) df.summary$dose <...)
- 18:37, 24 March 2022 Brb talk contribs uploaded File:Rerrorbar.svg (<pre> library(ggplot2) df <- ToothGrowth df$dosef <- as.factor(df$dose) library(dplyr) df.summary <- df %>% group_by(dosef) %>% summarise( sd = sd(len, na.rm = TRUE), len = mean(len) ) df.summary p1 <- ggplot(df, aes(dosef, len)) + geom_jitter(position = position_jitter(0.2, seed=1), color = "darkgray") + geom_point(aes(x=dosef, y=len), shape="+", size=8, data=df.summary) + geom_errorbar(aes(ymin = len-sd, ymax = len+sd), width=.2, data = df.summary) df.summary$dose <...)
- 13:13, 18 March 2022 Brb talk contribs created page File:SnrVScor.png
- 13:13, 18 March 2022 Brb talk contribs uploaded File:SnrVScor.png
- 13:10, 18 March 2022 Brb talk contribs created page File:CorVSsnr.svg
- 13:10, 18 March 2022 Brb talk contribs uploaded File:CorVSsnr.svg
- 18:22, 14 March 2022 Brb talk contribs created page Filesystem (Created page with "= squashfs = '''squashfs''' is a heavy-compression based read-only filesystem that is capable of compressing 2 to 3 GB of data onto a 700MB. Linux liveCD are built using squas...")
- 13:15, 5 March 2022 Brb talk contribs created page File:AntiX21 mmedia.png
- 13:15, 5 March 2022 Brb talk contribs uploaded File:AntiX21 mmedia.png
- 16:23, 22 February 2022 WikiSysop talk contribs blocked Dli7319 talk contribs with an expiration time of indefinite (account creation disabled)
- 16:22, 22 February 2022 WikiSysop talk contribs blocked GraphViz talk contribs with an expiration time of indefinite (account creation disabled)
- 16:21, 22 February 2022 WikiSysop talk contribs blocked Unsightlyskit66 talk contribs with an expiration time of indefinite (account creation disabled)
- 16:20, 22 February 2022 WikiSysop talk contribs blocked Tangiblealloy75 talk contribs with an expiration time of indefinite (account creation disabled)