<!DOCTYPE html PUBLIC "-//W3C//DTD XHTML 1.0 Transitional//EN" "http://www.w3.org/TR/xhtml1/DTD/xhtml1-transitional.dtd">


<html xmlns="http://www.w3.org/1999/xhtml" xml:lang="en"
      lang="en">


<head>
    <meta http-equiv="Content-Type"
          content="text/html;charset=utf-8" />

    <title>
        document_view
        &mdash;
        bioconductor.org
    </title>

    
        
            <base href="" />
        
    

    <meta name="generator" content="Plone - http://plone.org" />

    <meta content="sfadmin" name="DC.creator" />
    <meta content="2006-10-10 13:22:10"
          name="DC.date.created" />
    <meta content="2006-10-10 13:22:10"
          name="DC.date.modified" />
    <meta content="Document" name="DC.type" />
    <meta content="text/plain" name="DC.format" />

    <!-- Basic crude style for Netscape4.x - This can be removed
         if you don't want the special NS4 look - it will still work,
         just be plain text instead. Column layout for Netscape4.x included -->
    <link rel="Stylesheet" type="text/css"
          href="../../../../../ploneNS4.css" />

    <!-- Column style sheet. -->
    <style type="text/css" media="screen"><!-- @import url(http://bioconductor.org/ploneColumns.css); --></style>

    <!-- Main style sheets for CSS2 capable browsers -->
    <style type="text/css" media="screen"><!-- @import url(http://bioconductor.org/plone.css); --></style>

    <!-- Old style sheet from Plone 1.0, remove tal:condition="nothing" if you need to use the old styles.
         Will be removed in Plone 2.1. -->
    

    <!-- Alternate style sheets for the bigger/smaller text switcher -->
    <link rel="alternate stylesheet" type="text/css"
          media="screen"
          href="../../../../../ploneTextSmall.css"
          title="Small Text" />
    <link rel="alternate stylesheet" type="text/css"
          media="screen"
          href="../../../../../ploneTextLarge.css"
          title="Large Text" />

    <!-- Style sheet used for printing -->
    <link rel="stylesheet" type="text/css" media="print"
          href="../../../../../plonePrint.css" />

    <!-- Style sheet used for presentations (Opera is the only browser supporting this at the moment) -->
    <link rel="stylesheet" type="text/css"
          media="projection"
          href="../../../../../plonePresentation.css" />

    <!-- Internet Explorer CSS Fixes -->
    <!--[if IE]>
    <style type="text/css" media="all">@import url(http://bioconductor.org/ploneIEFixes.css);</style>
    <![endif]-->


    <!-- Custom style sheet if available -->
    <style type="text/css" media="all"><!-- @import url(http://bioconductor.org/ploneCustom.css); --></style>

    <link rel="shortcut icon"
          href="../../../../../favicon.ico"
          type="image/x-icon" />

    <link rel="search"
          href="../../../../../search_form"
          title="Search this site" />

    

    <link rel="up"
          href="../GSEA.1"
          title="Up one level" />

    

    <!-- Disable IE6 image toolbar -->
    <meta http-equiv="imagetoolbar" content="no" />

    
      <!-- A slot where you can insert CSS in the header from a template -->
        
    

    

    <!-- min-width support for IE via Javascript, required for tableless -->
    <!--[if IE]>
    <script type="text/javascript"
            src="http://bioconductor.org/plone_minwidth.js"></script>
    <![endif]-->

    
    
    
    
    


    
      <!-- A slot where you can insert elements in the header from a template -->
    

    
      <!-- A slot where you can insert javascript in the header from a template -->
        
    

    <!-- Common Plone ECMAScripts -->

    <!-- Pull-down ECMAScript menu, only active if logged in -->
    

    <!-- old google analytics here -->

    <!-- Define dynamic server-side variables for javascripts in this one  -->
    <script type="text/javascript"
            src="../../../../../plone_javascript_variables.js">
    </script>

    <script type="text/javascript"
            src="../../../../../plone_javascripts.js">
    </script>

    

      <!-- Old JS from Plone 1.0, remove tal:condition="nothing" if you need to use the old pop-ups.
           Will be removed in Plone 2.1 -->
      

    
  </head>

<body class="section-workshops">

<div id="visual-portal-wrapper">

<div id="portal-top">

    <a href="GSEA.R#documentContent" class="hiddenStructure">Skip to content.</a>



    <h1 id="portal-logo">
    <a href="../../../../../index.html">bioconductor.org</a>
</h1>

    <div id="portal-slogan"><p>Bioconductor is an open source and open development software project<br />
for the analysis and comprehension of genomic data.</p></div>

    
    <h5 class="hiddenStructure">Sections</h5>

    <ul id="portal-globalnav"><li id="portaltab-index_html"
    class="plain"><a href="../../../../../index.html"
                     accesskey="t">Home</a></li><li
    id="portaltab-GettingStarted" class="plain"><a
    href="../../../../../GettingStarted"
    accesskey="t">Getting Started</a></li><li
    id="portaltab-overview" class="plain"><a
    href="../../../../../overview" accesskey="t">Overview</a></li><li
    id="portaltab-download" class="plain"><a
    href="../../../../../download" accesskey="t">Downloads</a></li><li
    id="portaltab-docs" class="plain"><a
    href="../../../../../docs" accesskey="t">Documentation</a></li><li
    id="portaltab-biocpub" class="plain"><a
    href="../../../../../pub" accesskey="t">Publications</a></li><li
    id="portaltab-workshops" class="selected"><a
    href="../../../../../workshops" accesskey="t">Workshops</a></li><li
    id="portaltab-cabig" class="plain"><a
    href="http://wiki.fhcrc.org/caBioc" accesskey="t">caBIG</a></li></ul>



    



</div>

<div class="visualClear"></div>



<!-- The wrapper div. It contains the three columns. -->
<div id="portal-columns" class="visualColumnHideNone">

















    <!-- start of the main and left columns -->
    <div id="visual-column-wrapper">

        <!-- start of main content block -->
        <div id="portal-column-content" class="topmargin1">

            <div id="content" class="">

                

                <div class="documentContent" id="region-content">

                    <a name="documentContent"></a>

                    

                    

                    
    


        <h1 class="documentFirstHeading">GSEA.R</h1>
        
        
    
        <div class="documentDescription"></div>

    
        
    
        <div class="plain">
            <p>###################################################
### chunk number 1: Setup
###################################################
library("Biobase")
library("annotate")
library("Category")
library("hgu95av2")
library("genefilter")</p>
<p>###################################################
### chunk number 2: Example-subset
###################################################
library("ALL")
data(ALL)
Bcell <- grep("^B", as.character(ALL$BT))
bcrAblOrNegIdx <- which(as.character(ALL$mol.biol) %in% c("NEG", "BCR/ABL"))
eset <- ALL[, intersect(Bcell, bcrAblOrNegIdx)]
eset$mol.biol <- factor(eset$mol.biol)
numBN <- length(eset$mol.biol)</p>
<p>###################################################
### chunk number 3: noEntrez
###################################################
entrezIds <- mget(geneNames(eset), envir=hgu95av2LOCUSID)
haveEntrezId <- names(entrezIds)[sapply(entrezIds, function(x) !is.na(x))]
numNoEntrezId <- length(geneNames(eset)) - length(haveEntrezId)
eset <- eset[haveEntrezId, ]</p>
<p>###################################################
### chunk number 4: simplefiltering
###################################################
## Non-specific filtering based on IQR
lowQ = rowQ(eset, floor(0.25 <em> numBN))
upQ = rowQ(eset, ceiling(0.75 </em> numBN))
iqrs = upQ - lowQ</p>
<p>selected <- iqrs > 0.5</p>
<p>nsFiltered <- eset[selected, ]</p>
<p>###################################################
### chunk number 5: reduceto1to1
###################################################
## Reduce to unique probe <--> gene mapping by keeping largest IQR
## This gives us "unique genes" in the non-specific filtered gene
## set which simplifies further calculations.
nsFilteredIqr <- iqrs<a href="#refselected">[selected]</a>
uniqGenes <- findLargest(geneNames(nsFiltered), nsFilteredIqr, "hgu95av2")
nsFiltered <- nsFiltered[uniqGenes, ]</p>
<p>## basic stats on our non-specific filter result
numSelected <- length(geneNames(nsFiltered))
numBcrAbl <- sum(nsFiltered$mol.biol == "BCR/ABL")
numNeg <- sum(nsFiltered$mol.biol == "NEG")</p>
<p>###################################################
### chunk number 6: noKEGG
###################################################
## Remove genes with no PATH mapping
havePATH <- sapply(mget(geneNames(nsFiltered), hgu95av2PATH),
                 function(x) if (length(x) == 1 && is.na(x)) FALSE else TRUE)
numNoPATH<- sum(!havePATH)
nsF <- nsFiltered[havePATH, ]</p>
<p>###################################################
### chunk number 7: compAmat
###################################################<p> Am = PWAmat("hgu95av2")
 egN = unlist(mget(geneNames(nsF), hgu95av2LOCUSID))</p>
<p> sub1 = match(egN, row.names(Am))</p>
<p> Am = Am<a href="GSEA.R#refsub1,">[sub1,]</a>
 dim(Am)
 table(colSums(Am))</p>
</p>
<p>###################################################
### chunk number 8: compttests
###################################################</p>
<p>rtt = rowttests(nsF, "mol.biol")
rttStat = rtt$statistic</p>
<p>###################################################
### chunk number 9: reducetoInt
###################################################
 Amat = t(Am)
 rs = rowSums(Amat)
 Amat2 = Amat[rs>10,]
 rs2 = rs[rs>10]
 nCats = length(rs2)</p>
<p>###################################################
### chunk number 10: pctests
###################################################</p>
<p>tA = as.vector(Amat2 %*% rttStat)
tAadj = tA/sqrt(rs2)</p>
<p>names(tA) = names(tAadj) = row.names(Amat2)</p>
<p>###################################################
### chunk number 11: qqplot
###################################################
 qqnorm(tAadj)</p>
<p>###################################################
### chunk number 12: findSmPW
###################################################</p>
<p>smPW = tAadj[tAadj < -5]
pwName = KEGGPATHID2NAME[[names(smPW)]]
pwName</p>
<p>###################################################
### chunk number 13: mnplot
###################################################
 KEGGmnplot(names(smPW), nsF, "hgu95av2", nsF$"mol.biol")</p>
<p>###################################################
### chunk number 14: heatmap
###################################################
 KEGG2heatmap(names(smPW), nsF, "hgu95av2")</p>
<p>###################################################
### chunk number 15: ttperm
###################################################</p>
<p>NPERM = 100
ttp = ttperm(exprs(nsF), nsF$mol.biol, NPERM)</p>
<p>permDm = do.call("cbind", lapply(ttp$perms, function(x) x$statistic))</p>
<p>permD = Amat2 %*% permDm</p>
<p>pvals = matrix(NA, nr=nCats, ncol=2)
dimnames(pvals) = list(row.names(Amat2), c("Lower", "Upper"))</p>
<p>for(i in 1:nCats) {
    pvals<a href="GSEA.R#refi,1">[i,1]</a> = sum(permD<a href="GSEA.R#refi,">[i,]</a> < tA<a href="GSEA.R#refi">[i]</a>)/NPERM
    pvals<a href="GSEA.R#refi,2">[i,2]</a> = sum(permD<a href="GSEA.R#refi,">[i,]</a> > tA<a href="GSEA.R#refi">[i]</a>)/NPERM
}</p>
<p>ord1 = order(pvals<a href="GSEA.R#ref,1">[,1]</a>)
lowC = (row.names(pvals)<a href="GSEA.R#reford1">[ord1]</a>)[pvals<a href="GSEA.R#reford1,1">[ord1,1]</a>< 0.05]</p>
<h2>highC = row.names(pvals)[pvals<a href="GSEA.R#ref,2">[,2]</a> < 0.05]</h2>
<p> getPathNames(lowC)</p>
<p> getPathNames(highC)</p>
<p> lnhC = length(highC)</p>
<p>###################################################
### chunk number 16: findAmap
###################################################</p>
<p>AmChr = MAPAmat("hgu95av2", minCount=5)</p>
<p>###################################################
### chunk number 17: sub2ourData
###################################################<p> subC = row.names(AmChr) %in% egN</p>
<p> AmChr = AmChr<a href="GSEA.R#refsubC,">[subC,]</a>
 dim(AmChr)
 table(colSums(AmChr))</p>
</p>
<p>###################################################
### chunk number 18: 
###################################################
sessionInfo()</p>

        </div>
    
        

    


                    
                        <div class="discussion">

    

</div>
                    

                </div>

            </div>

        </div>
        <!-- end of main content block -->

        <!-- start of the left (by default at least) column -->
        <div id="portal-column-one">
            <div class="visualPadding"> <br><br><br>

               <!-- disabled left slot image <img tal:replace="structure nocall:here/pict.jpg" /> -->


                
                    

    

        
            
    <div class="portlet" id="portlet-navigation-tree">
    <div>
        <h5>Navigation</h5>
        <div class="portletBody">
            <div class="portletContent odd">
                
                
                    
                        <a href="../../../../../GettingStarted/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Getting Started</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../../overview/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Overview</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../../download/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Downloads</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../../docs/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Documentation</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../../pub/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Publications</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Workshops</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2010/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2010</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2009/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2009</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2008/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2008</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2007/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2007</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2006</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../index.html"
                           accesskey="n"
                           class="navItem navLevel3"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">R/Bioc Intro Course - October</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../index.html"
                           accesskey="n"
                           class="navItem navLevel4"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">labs</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../cDNA/index.html"
                           accesskey="n"
                           class="navItem navLevel5"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">cDNA (Two Color) Microarray</span>
                        </a>

                        
                    
                
                
                    
                        <a href="index.html"
                           accesskey="n"
                           class="navItem navLevel5 currentNavItem"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">GSEA</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../BioC2006/index.html"
                           accesskey="n"
                           class="navItem navLevel3"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">BioC2006</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../aucklandwksp/index.html"
                           accesskey="n"
                           class="navItem navLevel3"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Workshops on S, R and Bioconductor</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../biocintro_april/index.html"
                           accesskey="n"
                           class="navItem navLevel3"
                           title="April Intro R/Bioc Course at FHCRC">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">R/Bioc Intro Course</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../rforbioinformatics/index.html"
                           accesskey="n"
                           class="navItem navLevel3"
                           title="Course materials.  The course took place at FHCRC Seattle in January 2006">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">R for Bioinformatics</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2005/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2005</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2004/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2004</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2003/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2003</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../2002/index.html"
                           accesskey="n"
                           class="navItem navLevel2"
                           title="Workshops and courses 2002">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">2002</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../../developers/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">Developers</span>
                        </a>

                        
                    
                
                
                    
                        <a href="../../../../../News/index.html"
                           accesskey="n"
                           class="navItem navLevel1"
                           title="BioC Project News">
<!-- Disable Folder icon 
                            <img src="" height="16" width="16" alt=""
                                 class="navIcon"
                                 tal:condition="not:isAnon"
                                 tal:attributes="src python:portal_url+'/'+sibling.getIcon(1);                                                 
                                 title sibling/Type;" />
-->

                            <span class="navItemText">News</span>
                        </a>

                        
                    
                
                
            </div>
        </div>
    </div>
</div>

        

        
    

                
                &nbsp;
            </div>
        </div>
        <!-- end of the left (by default at least) column -->

    </div>
    <!-- end of the main and left columns -->

    <!-- start of right (by default at least) column -->
    <div id="portal-column-two">
        <div class="visualPadding">
            
                

    
        
            <div>
      <!-- The Related Items box -->

      <script type="text/javascript" src="plonesearchbox_utils.js">
      </script>

      <div class="portlet">
 <!-- 
        <h5 i18n:translate="searchbox_title">Search Box</h5>
-->        
        <div class="portletBody">
          
          <form name="searchbox_form" id="searchbox_form"
                method="post" onsubmit="return process()"
                action="http://bioconductor.org/workshops/2006/biocintro_oct/labs/GSEA/redirectToUrl" target="_blank">
            <div class="portletContent odd">
              <div id="searchbox_fields">
                <input type="text" name="toSearch" id="toSearch" size="22" />
              </div>
              
              <select name="choice" id="choice" onchange="return generateForm();" style="margin: 3px 0px 0px 0px;">
                <option value="http://bioconductor.org/workshops/2006/biocintro_oct/labs/GSEA/GSEA.R/search?SearchableText="
                        id="search_portal">In this site</option>
                
                  <option value="http://bioconductor.org/workshops/2006/biocintro_oct/labs/GSEA/GSEA.R/search?path=/Plones/rgentlem/bioconductor/workshops/2006/biocintro_oct/labs/GSEA/GSEA.R&amp;SearchableText="
                          id="search_rubric">In this folder</option>
                
                
                <option value="http://google.com/search?sitesearch=www.bioconductor.org&amp;q=%(text)s">Google this site</option>
              </select>
<input class="context searchButton" type="submit"
       value="Search" style="margin: 3px;" /> 
            </div>
 <!-- 
            <div class="portletContent odd">
              <input class="context searchButton" type="submit" value="Search" style="margin: 3px;"  i18n:attributes="value"/> 
            </div>

            <div class="portletContent even">
              <a href="" tal:attributes="href string:${portal_url}/search_form" i18n:translate="advanced_search_link">Advanced search</a>
            </div>
 -->
          </form>
          <script type="text/javascript">

            <!--
            /*in case the first choice of the combobox is an url with several fields*/
            clearForm();
            generateForm();
            -->
          </script>
          

        </div>
      </div>
    </div>
        

        
    
    
        
            

    <div class="portlet" id="portlet-news">

        <h5>News</h5>

        <div class="portletBody">

            

                <div class="portletContent odd">

                    <div class="portletDetails">
                         <a href="../../../../../News/2009-10-28-Release-2.5"
                            class="date"
                            title="BioC 2.5 Released">2009-10-26</a>
                         <p>
                           BioC 2.5, consisting of 352 packages and designed to work with R 2.10.z, was released today.
                         </p>
                    </div>              

                </div>

            
            

                <div class="portletContent even">

                    <div class="portletDetails">
                         <a href="../../../../../News/RinNYT"
                            class="date"
                            title="Print Media Recognition">2009-01-07</a>
                         <p>
                           R, the open source platform used by Bioconductor, featured in a series of articles in the New York Times.
                         </p>
                    </div>              

                </div>

            

            <div class="portletContent odd">

                <a href="../../../../../news"
                   class="portletMore">
                    More...
                </a>

            </div>

        </div>

    </div>


        

        
    
    
        
            
        

        
    

            
            &nbsp;
        </div>
    </div>
    <!-- end of the right (by default at least) column -->



</div>
<!-- end column wrapper -->

    <div class="visualClear"></div>



<hr class="netscape4" />

<div id="portal-footer">

&copy; 2003-2009 BioConductor. All Rights Reserved. 

<script type="text/javascript">
var gaJsHost = (("https:" == document.location.protocol) ? "https://ssl." : "http://www.");
document.write(unescape("%3Cscript src='" + gaJsHost + "google-analytics.com/ga.js' type='text/javascript'%3E%3C/script%3E"));
</script>
<script type="text/javascript">
try{
    var pageTracker = _gat._getTracker("UA-357281-1");
    pageTracker._trackPageview();
} catch(err) {}
</script>
</div>



</div>

</body>
</html>