HUgene 2.0 analyses heatmap
1
0
Entering edit mode
kanacska ▴ 10
@kanacska-7375
Last seen 8.6 years ago
Hungary

Hi! I've did a microarray analyses with Affymetrix gene chip (HG U133). I dont know why but my heatmap doesnt look good, the coloring is not symmetric. My heatmap is for comparing the arrays (3-3 array /sample) gene expression. Has anyone have a clue why this could be, when my annotation is good???

 

Thanks,

 

Anna

 

hugene20 heatmap affymetrixchip • 2.3k views
ADD COMMENT
0
Entering edit mode

You will have to be much more descriptive, and tell us exactly what you are trying to do, and what you have done so far. The heatmap you link to is from here, which may or may not be what you are trying to accomplish (I sort of doubt it is what you want to do).

Most heatmaps that people create are not symmetric like this; in general this sort of heatmap is intended to show that replicate samples are similar in some sense, and if you want to do that sort of thing, then a PCA plot is probably a more reasonable thing to do.

Anyway, if you tell us what you are trying to accomplish and what you have done so far (show code!), then perhaps we can help.

ADD REPLY
0
Entering edit mode

Hi,

I have 2 samples, 3-3 biological repeat and i want to do QC: histogram, boxplot, MA plot, heatmap etc. The heatmap has to show the replicates similarity after normalization, and somehow its not simetric as on the link which ive pasted before and i dont know why. I want to know why does this happen (this is the first time that it had happend)

 

I pasted in the begining of the code and i did hashmarks for QC steps which ive done next to heatmap( for dose the code is not important)

celdir<- 'c:\\....\\outplotdir'
filename2sample<- 'c:\\.....\\filename2sample.txt'
gzipped <-TRUE
outplotdir<- 'c:\\....\\outplotdir'
affyutils <- 'c:\\.....\\AffyUtils.R'

# read in home-made utility functions

source(affyutils)

# libraries


# libraries
library(EBImage);
library(affy); 
library(simpleaffy);
library(affyPLM); 
library(arrayQualityMetrics);
# change into directory with cel files
setwd(celdir) #set working directory
# create sampleNames from the list of celFiles - substitute file names with sample names
celFiles <- list.celfiles()
fn2sp <- read.table(filename2sample, header=T)
sNames <- unlist(lapply(celFiles, convertFilename2Sample, tabledict=fn2sp)) # convertFilename2Sample: from AffyUtils #samplenames


# Read in the CEL files in the directory
raw <- ReadAffy(filenames=celFiles, sampleNames = sNames)

# DNA degradation plot(sample quality)

# Affy control expression (hybridization and overall sample quality)

# actin & GAPDH

# perform a robust multi-chip probe-level fit 
norm <- rma(raw); expr <- exprs(norm);
Pda <- fitPLM(raw, model = PM ~ -1 + probes + samples)


# NUSE, RLE (probe set homogeneity)

#Boxplot raw

# density histogram (signal comparability)
 #PM histogram

# MA plot (intensity dependent bias)

# MvA plot of normalized data:

# 2D image of chip (spatial bias)

# dist - returns distance matrix between rows
distmx <- dist(t(expr), method = "euclidean", diag = TRUE, upper = TRUE)
# plot heatmap 

my.hclust <- function(d) hclust(d, method="complete")
heatmap(as.matrix(distmx),  cexCol=0.5, cexRow=0.5, hclustfun=my.hclust)

-----------------------------------------------------------

ADD REPLY
0
Entering edit mode
alakatos ▴ 130
@alakatos-6983
Last seen 4.6 years ago
United States

Hi Anna,

I recommend package "gplot" - heatmap.2 function. 

library(gplots)

y  is your expression matrix  ### y <- exprs(eset)  or subset

hr <- hclust(as.dist(1-cor(t(y), method="pearson")), method="average");
hc <- hclust(as.dist(1-cor(y, method="kendall")), method="average") 
mycl <- cutree(hr, h=max(hr$height)/1.3);
mycolhc <- rainbow(length(unique(mycl)), start=0.1, end=0.9);
mycolhc <- mycolhc[as.vector(mycl)]
myheatcol <- greenred(75)

heatmap.2(y, Rowv=as.dendrogram(hr), Colv=as.dendrogram(hc), col=myheatcol, scale="row", density.info="none", trace="none", key = FALSE, cexRow = 0.7, cexCol = 0.8, srtRow = NULL, srtCol= 20, labRow = TRUE, main = " whatever you want",  RowSideColors=mycolhc, labCol= TRUE )
Please check this website http://www.inside-r.org/packages/cran/gplots/docs/heatmap.2 for explanation! 

You can change the "method" according to your preference and of course  all the other arguments.

I hope it helps.

Anita

ADD COMMENT

Login before adding your answer.

Traffic: 608 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6