Computer Exercise - Microarray Analysis using Bioconductor

Size: px
Start display at page:

Download "Computer Exercise - Microarray Analysis using Bioconductor"

Transcription

1 Computer Exercise - Microarray Analysis using Bioconductor Introduction The SWIRL dataset The SWIRL dataset comes from an experiment using zebrafish to study early development in vertebrates. SWIRL is a point mutant in the BMP2 gene that affects the dorsal/ventral body axis. One of the goals of the SWIRL experiment is to identify genes with altered expression in the BMP2 mutant compared to the wild-type zebrafish. The SWIRL dataset is provided by Katrin Wuennenberg-Stapleton from the Ngai Lab at UC Berkley. Table 1 shows the experimental setup. R stands for red and G for green which is the names that the two dyes usually are called. Other common names are Cy5 (red) and Cy3 (green). Array number Mutant dye Wild-type dye 1 Cy3 (G) Cy5 (R) 2 Cy5 (R) Cy3 (G) 3 Cy3 (G) Cy5 (R) 4 Cy5 (R) Cy3 (G) Table 1: Experimental setup for the SWIRL dataset. To download the data write the following lines in a xterm window wget wget 1

2 wget wget wget LIMMA - a package in Bioconductor LIMMA stands for Linear Models in Microarry Analysis and is a Bioconductor package for microarray analysis. The package is maintained by Gordon Smyth who has also written several papers in the field of microarray analysis. The LIMMA package contains a broad collection of tools and some of them are especially designed for the analysis of two-channel spotted cdna microarray data. In this lab we will use LIMMA for several reasons. First, LIMMA is developed at a fast pace, which means that new methods are continuously added as they come available. LIMMA is also fairly easy to learn and well documented (at least relative to the other packages in Bioconductor). To load LIMMA in R simply type library(limma) and wait a few seconds. There are several ways to access the LIMMA documentation. The easiest way is to use the included help files. These can be read directly in R by using the help command: help( 01.Introduction ) In addition, the following sections might be of interest: 02.Classes, 03.ReadingData, 04.Background, 05.Normalization, 06.LinearModels, 07.SingleChannel, 08.Tests, 09.Diagnostics and 10.Other. A user guide for LIMMA is available on erikkr/macourse2008/. Exercises Exercises marked with a star (*) are a bit more tricky and may be skipped without interrupting the flow of the lab. 2

3 Basic input/output in LIMMA To start analyzing the data the first step is to read the data into R. This part can be rather tricky depending on the format of the data. In our case, the data is an output file from the image analysis program Spot. Exercise 1 Use the read.maimages command to load the files into LIMMA. The best way to do this is to save the names of the different files in a vector > files<-c("swirl.1.spot", "swirl.2.spot", "swirl.3.spot", "swirl.4.spot") After that, use the read.maimages command to read the files into R > RG<-read.maimages(files, source="spot") Use the names command to see which elements the resulting list RG contains. Can you figure out what they stand for? Take a look at the contents of the different elements. What type of objects are they? The command class can be used here in the following way class(rg[[1]]) The raw numbers from the slide has now been read into LIMMA, but we also need some metadata, that is, some information about the data. Examples on metadata in this case is the layout of the array and an annotation list. Exercise 2a In our case, the layout and the annotation list are stored in a so called GALfile. Make sure that you have downloaded the GAL-file ( fish.gal ) and read it into LIMMA by using the readgal command. > RG$genes<-readGAL(galfile="fish.gal") This saves the result in element called genes in the list RG. Make sure that everything worked by listing the first 15 rows of RG$genes. Exercise 2b The next step is to extract the information of the layout. Since the GAL-file contais this information as well, we can get it directly from the RG$genes by the getlayout command. > RG$printer<-getLayout(RG$genes) 3

4 This saves the result in RG$printer. printer element contain? What kind of information does the Exercise 3a The MA.RG command can be used to create MA values of our list RG. To do this, simply type MA<-MA.RG(RG) As you might remember from the lectures, the M and A values are defined as M = log(r) log(g) A = log(r) + log(g). 2 MA values has several advantages compared to RG values both when it comes to visualization and statistical analysis. It is also possible to go from MA values and create RG values. Based on the equations above, can you figure out how to do this? Exercise 3b Look at the documentation for the MA.RG function - what are the default values of the parameters? How would you create MA values that are not background corrected? (Note that background correction not always is advisory.) Visualization of microarray data You should now have two variables, one named RG which contains the raw data, the annotation list, and the layout, and one containing all the MA-values. Our next step is to try to get a picture of what the data looks like. Here, a useful command is x11() which produces a new window to plot in, thus keeping the current plot. Exercise 4 We start by examining the RG values for each array. The plotdensities function plots the distribution of spot values for both channels and such a plot can be used to see if there is any bias toward any of the dyes. Plot the distribution of the spot values for all four arrays both with and without log 4

5 transformation. Can you say something about the dye bias from these plots? Exercise 4b To determine which pairs of densities fit together, use the command layout to plot several subplots in the same plot (layout(matrix(1:4,ncol=2))). In each subplot, plot only the density of one of the arrays (look at the documentation of plotdensities). Exercise 5 Use plotma to create a MA-plot for each array. Do the arrays differ? Are there any trends? Use the text command to plot BMP2 at the location of the BMP2 gene. Is the gene regulated? Should it be regulated? Hint: The M-values for the BMP2 -gene can be gotten using the command: MA$M[RG$genes$Name=="BMP2",] The text command is here used as follows: text(x=bmp2.a,y=bmp2.m,labels="bmp2",col="red") Exercise 6 Since we are going to use the information from all four arrays it is important to check that none of the arrays are different. One way to get an easy overview is to make box-plots of the M-values for each array. Create a boxplot of the M-values. The command you need is boxplot, which does not handle matrices properly, so convert the M-values to a dataframe: boxplot(as.data.frame(ma$m)) Interpret the result! Normalization of microarrays Using the MA-plots that were created in Exercise 5, it is possible to see a trend which depends on the A-value, that is, the total intensity. We have also detected some dye bias in the density plots from Exercise 4. Exercise 7 Create a MA-plot of one of the arrays and add a loess-line. As in Exercise 5, the command to create a MA-plot in LIMMA is plotma. To calculate a loess line, the command lowess is useful and use lines to add a line to an existing plot. 5

6 Exercise 8 Normalize the data by the global loess method with the normalize- WithinArrays command. This commands takes an MA-list and returns a normalized MA-list. For example, MAnorm<-normalizeWithinArrays(MA, method= loess ) Create a MA-plot for each array of the result. Compare to the plots made in Exercise 5. Exercise 9 Repeat Exercise 4 with the normalized data. Has the dye bias disappeared? Why? Use RG.MA to convert the normalized MA values to RG values. Exercise 10 Repeat Exercise 6 with the normalized data. Have the differences increased or decreased? Use the command normalizebetweenarrays with the quantile method to make a second normalization. Compare the result with a new boxplot. Make a new density plot of the RG values afterwards. Compare to exercises 4 and 9. Statistics and ranking We are now ready to identify the genes that are most likely to be regulated, using several different statistics, for both the non-normalized and normalized MA-values. First, we need to calculate the average fold-change over all the arrays. In LIMMA this is usually done by the lmfit command which requires two arguments; MA-values and a design matrix. The design matrix in our case is a vector containing 1 and -1 indicating the different dyes. In our case, a valid design matrix can be created by designmatrix<-c(-1,1,-1,1) Call lmfit in the following way MAfit<-lmFit(MA, designmatrix) # Call lmfit and save the result in MAfit Exercise 11 Use lmfit and the design matrix above to calculate the average M-values over all the arrays. Do this for both the non-normalized and the normalized values. Save the result in variables with suitable names. 6

7 Exercise 12 Calculate the moderated statistics by the ebayes command which takes a result from lmfit as an argument and adds the moderated t-statistics. For example, MAstat<-eBayes(MAfit) Do this for both the non-normalized and the normalized values. Exercise 13 Use the toptable command to create a list of the 50 most regulated genes based on the M-value and the moderated t-statistic. toptable(mastat, n=50) Do they differ much? Is there any way to see if one of the lists is more true than the other one? Do the lists of genes between the non-normalized data and the normalized data differ? Can we say which one that is more correct? Exercise 14 Create new MA-plots with the average A-value in the x-axis and the average M-value on the y-axis. Mark the 50 most regulated genes according to the M-value threshold on one of the plots and the 50 most regulated genes according to the moderated t-statistic in the other plot. Do you spot any difference? Why? The average M-value is available from the result from lmfit and the moderated t-statistic is available from the result of ebayes. To sort the statistics use order. apply can be used to calculate the average A-values and the plot function to create a plot. To mark the top 50 genes use the points with the argument col= blue. GOOD LUCK 7

8 Functions LIMMA backgroundcorrect - background correction ebayes - calculates statistics getlayout - extracts the array layout from the annotation list lmfit - calculates the average M-values over a set of arrays MA.RG - transforms RG values into MA values normalizebetweenarrays - normalization between different arrays normalizewithinarrays - normalization within a single array plotdensities - creates density plots of the colors from a array plotma - creates a MA plot read.maimages - reads microarray data into LIMMA readgal - reads annotation list into LIMMA RG.MA - transforms MA values into RG values toptable - prints the top most regulated genes R boxplot - creates a boxplot lines - plots a line lowess - calculates a loess line points - plots a point to an existing plot text - plots texts to an existing plot 8

Microarray Data Analysis (V) Preprocessing (i): two-color spotted arrays

Microarray Data Analysis (V) Preprocessing (i): two-color spotted arrays Microarray Data Analysis (V) Preprocessing (i): two-color spotted arrays Preprocessing Probe-level data: the intensities read for each of the components. Genomic-level data: the measures being used in

More information

Introduction to the Bioconductor marray package : Input component

Introduction to the Bioconductor marray package : Input component Introduction to the Bioconductor marray package : Input component Yee Hwa Yang 1 and Sandrine Dudoit 2 April 30, 2018 Contents 1. Department of Medicine, University of California, San Francisco, jean@biostat.berkeley.edu

More information

MATH3880 Introduction to Statistics and DNA MATH5880 Statistics and DNA Practical Session Monday, 16 November pm BRAGG Cluster

MATH3880 Introduction to Statistics and DNA MATH5880 Statistics and DNA Practical Session Monday, 16 November pm BRAGG Cluster MATH3880 Introduction to Statistics and DNA MATH5880 Statistics and DNA Practical Session Monday, 6 November 2009 3.00 pm BRAGG Cluster This document contains the tasks need to be done and completed by

More information

Normalization: Bioconductor s marray package

Normalization: Bioconductor s marray package Normalization: Bioconductor s marray package Yee Hwa Yang 1 and Sandrine Dudoit 2 October 30, 2017 1. Department of edicine, University of California, San Francisco, jean@biostat.berkeley.edu 2. Division

More information

The analysis of acgh data: Overview

The analysis of acgh data: Overview The analysis of acgh data: Overview JC Marioni, ML Smith, NP Thorne January 13, 2006 Overview i snapcgh (Segmentation, Normalisation and Processing of arraycgh data) is a package for the analysis of array

More information

Bioconductor s stepnorm package

Bioconductor s stepnorm package Bioconductor s stepnorm package Yuanyuan Xiao 1 and Yee Hwa Yang 2 October 18, 2004 Departments of 1 Biopharmaceutical Sciences and 2 edicine University of California, San Francisco yxiao@itsa.ucsf.edu

More information

/ Computational Genomics. Normalization

/ Computational Genomics. Normalization 10-810 /02-710 Computational Genomics Normalization Genes and Gene Expression Technology Display of Expression Information Yeast cell cycle expression Experiments (over time) baseline expression program

More information

PROCEDURE HELP PREPARED BY RYAN MURPHY

PROCEDURE HELP PREPARED BY RYAN MURPHY Module on Microarray Statistics for Biochemistry: Metabolomics & Regulation Part 2: Normalization of Microarray Data By Johanna Hardin and Laura Hoopes Instructions and worksheet to be handed in NAME Lecture/Discussion

More information

Exploring cdna Data. Achim Tresch, Andreas Buness, Tim Beißbarth, Wolfgang Huber

Exploring cdna Data. Achim Tresch, Andreas Buness, Tim Beißbarth, Wolfgang Huber Exploring cdna Data Achim Tresch, Andreas Buness, Tim Beißbarth, Wolfgang Huber Practical DNA Microarray Analysis, Heidelberg, March 2005 http://compdiag.molgen.mpg.de/ngfn/pma2005mar.shtml The following

More information

Exploring cdna Data. Achim Tresch, Andreas Buness, Tim Beißbarth, Wolfgang Huber

Exploring cdna Data. Achim Tresch, Andreas Buness, Tim Beißbarth, Wolfgang Huber Exploring cdna Data Achim Tresch, Andreas Buness, Tim Beißbarth, Wolfgang Huber Practical DNA Microarray Analysis http://compdiag.molgen.mpg.de/ngfn/pma0nov.shtml The following exercise will guide you

More information

Analysis of Spotted Microarray Data

Analysis of Spotted Microarray Data Analysis of Spotted Microarray Data John Maindonald Centre for Mathematics & its Applications, Australian National University The example data will be for spotted (two-channel) microarrays. Exactly the

More information

Exploring cdna Data. Achim Tresch, Andreas Buness, Wolfgang Huber, Tim Beißbarth

Exploring cdna Data. Achim Tresch, Andreas Buness, Wolfgang Huber, Tim Beißbarth Exploring cdna Data Achim Tresch, Andreas Buness, Wolfgang Huber, Tim Beißbarth Practical DNA Microarray Analysis http://compdiag.molgen.mpg.de/ngfn/pma0nov.shtml The following exercise will guide you

More information

Course on Microarray Gene Expression Analysis

Course on Microarray Gene Expression Analysis Course on Microarray Gene Expression Analysis ::: Normalization methods and data preprocessing Madrid, April 27th, 2011. Gonzalo Gómez ggomez@cnio.es Bioinformatics Unit CNIO ::: Introduction. The probe-level

More information

Bioconductor exercises 1. Exploring cdna data. June Wolfgang Huber and Andreas Buness

Bioconductor exercises 1. Exploring cdna data. June Wolfgang Huber and Andreas Buness Bioconductor exercises Exploring cdna data June 2004 Wolfgang Huber and Andreas Buness The following exercise will show you some possibilities to load data from spotted cdna microarrays into R, and to

More information

Analysis of Spotted Microarray Data

Analysis of Spotted Microarray Data Analysis of Spotted Microarray Data John Maindonald Statistics Research Associates http://www.statsresearch.co.nz/ Revised August 14 2016 The example data will be for spotted (two-channel) microarrays.

More information

Exploring cdna Data. Achim Tresch, Andreas Buness, Tim Beißbarth, Florian Hahne, Wolfgang Huber. June 17, 2005

Exploring cdna Data. Achim Tresch, Andreas Buness, Tim Beißbarth, Florian Hahne, Wolfgang Huber. June 17, 2005 Exploring cdna Data Achim Tresch, Andreas Buness, Tim Beißbarth, Florian Hahne, Wolfgang Huber June 7, 00 The following exercise will guide you through the first steps of a spotted cdna microarray analysis.

More information

Package INCATome. October 5, 2017

Package INCATome. October 5, 2017 Type Package Package INCATome October 5, 2017 Title Internal Control Analysis of Translatome Studies by Microarrays Version 1.0 Date 2017-10-03 Author Sbarrato T. [cre,aut], Spriggs R.V. [cre,aut], Wilson

More information

Codelink Legacy: the old Codelink class

Codelink Legacy: the old Codelink class Codelink Legacy: the old Codelink class Diego Diez October 30, 2018 1 Introduction Codelink is a platform for the analysis of gene expression on biological samples property of Applied Microarrays, Inc.

More information

CARMAweb users guide version Johannes Rainer

CARMAweb users guide version Johannes Rainer CARMAweb users guide version 1.0.8 Johannes Rainer July 4, 2006 Contents 1 Introduction 1 2 Preprocessing 5 2.1 Preprocessing of Affymetrix GeneChip data............................. 5 2.2 Preprocessing

More information

Package OLIN. September 30, 2018

Package OLIN. September 30, 2018 Version 1.58.0 Date 2016-02-19 Package OLIN September 30, 2018 Title Optimized local intensity-dependent normalisation of two-color microarrays Author Matthias Futschik Maintainer Matthias

More information

limma: A brief introduction to R

limma: A brief introduction to R limma: A brief introduction to R Natalie P. Thorne September 5, 2006 R basics i R is a command line driven environment. This means you have to type in commands (line-by-line) for it to compute or calculate

More information

Practical 2: Plotting

Practical 2: Plotting Practical 2: Plotting Complete this sheet as you work through it. If you run into problems, then ask for help - don t skip sections! Open Rstudio and store any files you download or create in a directory

More information

Package AffyExpress. October 3, 2013

Package AffyExpress. October 3, 2013 Version 1.26.0 Date 2009-07-22 Package AffyExpress October 3, 2013 Title Affymetrix Quality Assessment and Analysis Tool Author Maintainer Xuejun Arthur Li Depends R (>= 2.10), affy (>=

More information

Agi4x44Preprocess. Pedro Lopez-Romero. March 30, 2012

Agi4x44Preprocess. Pedro Lopez-Romero. March 30, 2012 Agi4x44Preprocess Pedro Lopez-Romero March 30, 2012 1 Package Overview The Agi4x44PreProcess package has been designed to read Agilent 4 x 44 gene expression arrays data files into R [3] for its pre-processing

More information

Organizing, cleaning, and normalizing (smoothing) cdna microarray data

Organizing, cleaning, and normalizing (smoothing) cdna microarray data Organizing, cleaning, and normalizing (smoothing) cdna microarray data All product names are given as examples only and they are not endorsed by the USDA or the University of Illinois. INTRODUCTION The

More information

Introduction to GE Microarray data analysis Practical Course MolBio 2012

Introduction to GE Microarray data analysis Practical Course MolBio 2012 Introduction to GE Microarray data analysis Practical Course MolBio 2012 Claudia Pommerenke Nov-2012 Transkriptomanalyselabor TAL Microarray and Deep Sequencing Core Facility Göttingen University Medical

More information

Applying Data-Driven Normalization Strategies for qpcr Data Using Bioconductor

Applying Data-Driven Normalization Strategies for qpcr Data Using Bioconductor Applying Data-Driven Normalization Strategies for qpcr Data Using Bioconductor Jessica Mar April 30, 2018 1 Introduction High-throughput real-time quantitative reverse transcriptase polymerase chain reaction

More information

Preprocessing -- examples in microarrays

Preprocessing -- examples in microarrays Preprocessing -- examples in microarrays I: cdna arrays Image processing Addressing (gridding) Segmentation (classify a pixel as foreground or background) Intensity extraction (summary statistic) Normalization

More information

AgiMicroRna. Pedro Lopez-Romero. April 30, 2018

AgiMicroRna. Pedro Lopez-Romero. April 30, 2018 AgiMicroRna Pedro Lopez-Romero April 30, 2018 1 Package Overview AgiMicroRna provides useful functionality for the processing, quality assessment and differential expression analysis of Agilent microrna

More information

Vector Xpression 3. Speed Tutorial: III. Creating a Script for Automating Normalization of Data

Vector Xpression 3. Speed Tutorial: III. Creating a Script for Automating Normalization of Data Vector Xpression 3 Speed Tutorial: III. Creating a Script for Automating Normalization of Data Table of Contents Table of Contents...1 Important: Please Read...1 Opening Data in Raw Data Viewer...2 Creating

More information

genbart package Vignette Jacob Cardenas, Jacob Turner, and Derek Blankenship

genbart package Vignette Jacob Cardenas, Jacob Turner, and Derek Blankenship genbart package Vignette Jacob Cardenas, Jacob Turner, and Derek Blankenship 2018-03-13 BART (Biostatistical Analysis Reporting Tool) is a user friendly, point and click, R shiny application. With the

More information

ROTS: Reproducibility Optimized Test Statistic

ROTS: Reproducibility Optimized Test Statistic ROTS: Reproducibility Optimized Test Statistic Fatemeh Seyednasrollah, Tomi Suomi, Laura L. Elo fatsey (at) utu.fi March 3, 2016 Contents 1 Introduction 2 2 Algorithm overview 3 3 Input data 3 4 Preprocessing

More information

Hands-On Exercise: Implementing a Basic Recommender

Hands-On Exercise: Implementing a Basic Recommender Hands-On Exercise: Implementing a Basic Recommender In this Hands-On Exercise, you will build a simple recommender system in R using the techniques you have just learned. There are 7 sections. Please ensure

More information

Package TilePlot. April 8, 2011

Package TilePlot. April 8, 2011 Type Package Package TilePlot April 8, 2011 Title This package analyzes functional gene tiling DNA microarrays for studying complex microbial communities. Version 1.1 Date 2011-04-07 Author Ian Marshall

More information

Gene Expression an Overview of Problems & Solutions: 1&2. Utah State University Bioinformatics: Problems and Solutions Summer 2006

Gene Expression an Overview of Problems & Solutions: 1&2. Utah State University Bioinformatics: Problems and Solutions Summer 2006 Gene Expression an Overview of Problems & Solutions: 1&2 Utah State University Bioinformatics: Problems and Solutions Summer 2006 Review DNA mrna Proteins action! mrna transcript abundance ~ expression

More information

MiChip. Jonathon Blake. October 30, Introduction 1. 5 Plotting Functions 3. 6 Normalization 3. 7 Writing Output Files 3

MiChip. Jonathon Blake. October 30, Introduction 1. 5 Plotting Functions 3. 6 Normalization 3. 7 Writing Output Files 3 MiChip Jonathon Blake October 30, 2018 Contents 1 Introduction 1 2 Reading the Hybridization Files 1 3 Removing Unwanted Rows and Correcting for Flags 2 4 Summarizing Intensities 3 5 Plotting Functions

More information

Computer lab 2 Course: Introduction to R for Biologists

Computer lab 2 Course: Introduction to R for Biologists Computer lab 2 Course: Introduction to R for Biologists April 23, 2012 1 Scripting As you have seen, you often want to run a sequence of commands several times, perhaps with small changes. An efficient

More information

How do microarrays work

How do microarrays work Lecture 3 (continued) Alvis Brazma European Bioinformatics Institute How do microarrays work condition mrna cdna hybridise to microarray condition Sample RNA extract labelled acid acid acid nucleic acid

More information

Bioconductor tutorial

Bioconductor tutorial Bioconductor tutorial Adapted by Alex Sanchez from tutorials by (1) Steffen Durinck, Robert Gentleman and Sandrine Dudoit (2) Laurent Gautier (3) Matt Ritchie (4) Jean Yang Outline The Bioconductor Project

More information

Package ffpe. October 1, 2018

Package ffpe. October 1, 2018 Type Package Package ffpe October 1, 2018 Title Quality assessment and control for FFPE microarray expression data Version 1.24.0 Author Levi Waldron Maintainer Levi Waldron

More information

Exploring gene expression datasets

Exploring gene expression datasets Exploring gene expression datasets Alexey Sergushichev Dec 4-5, St. Louis About the workshop We will cover the basic analysis of gene expression matrices No working with raw data The focus is on being

More information

Introduction to the Codelink package

Introduction to the Codelink package Introduction to the Codelink package Diego Diez October 30, 2018 1 Introduction This package implements methods to facilitate the preprocessing and analysis of Codelink microarrays. Codelink is a microarray

More information

Excel 2. Module 3 Advanced Charts

Excel 2. Module 3 Advanced Charts Excel 2 Module 3 Advanced Charts Revised 1/1/17 People s Resource Center Module Overview This module is part of the Excel 2 course which is for advancing your knowledge of Excel. During this lesson we

More information

Package dyebias. March 7, 2019

Package dyebias. March 7, 2019 Package dyebias March 7, 2019 Title The GASSCO method for correcting for slide-dependent gene-specific dye bias Version 1.42.0 Date 2 March 2016 Author Philip Lijnzaad and Thanasis Margaritis Description

More information

From raw data to gene annotations

From raw data to gene annotations From raw data to gene annotations Laurent Gautier (Modified by C. Friis) 1 Process Affymetrix data First of all, you must download data files listed at http://www.cbs.dtu.dk/laurent/teaching/lemon/ and

More information

Using metama for differential gene expression analysis from multiple studies

Using metama for differential gene expression analysis from multiple studies Using metama for differential gene expression analysis from multiple studies Guillemette Marot and Rémi Bruyère Modified: January 28, 2015. Compiled: January 28, 2015 Abstract This vignette illustrates

More information

Facets and Continuous graphs

Facets and Continuous graphs Facets and Continuous graphs One way to add additional variables is with aesthetics. Another way, particularly useful for categorical variables, is to split your plot into facets, subplots that each display

More information

NENS 230 Assignment 4: Data Visualization

NENS 230 Assignment 4: Data Visualization NENS 230 Assignment 4: Data Visualization Due date: Tuesday, October 20, 2015 Goals Get comfortable manipulating figures Familiarize yourself with common 2D and 3D plots Understand how color and colormaps

More information

Section 7D Systems of Linear Equations

Section 7D Systems of Linear Equations Section 7D Systems of Linear Equations Companies often look at more than one equation of a line when analyzing how their business is doing. For example a company might look at a cost equation and a profit

More information

CompClustTk Manual & Tutorial

CompClustTk Manual & Tutorial CompClustTk Manual & Tutorial Brandon King Copyright c California Institute of Technology Version 0.1.10 May 13, 2004 Contents 1 Introduction 1 1.1 Purpose.............................................

More information

Technical Arts 101 Prof. Anupam Saxena Department of Mechanical engineering Indian Institute of Technology, Kanpur. Lecture - 7 Think and Analyze

Technical Arts 101 Prof. Anupam Saxena Department of Mechanical engineering Indian Institute of Technology, Kanpur. Lecture - 7 Think and Analyze Technical Arts 101 Prof. Anupam Saxena Department of Mechanical engineering Indian Institute of Technology, Kanpur Lecture - 7 Think and Analyze Last time I asked you to come up with a single funniest

More information

Differential Expression Analysis at PATRIC

Differential Expression Analysis at PATRIC Differential Expression Analysis at PATRIC The following step- by- step workflow is intended to help users learn how to upload their differential gene expression data to their private workspace using Expression

More information

Matlab notes Matlab is a matrix-based, high-performance language for technical computing It integrates computation, visualisation and programming usin

Matlab notes Matlab is a matrix-based, high-performance language for technical computing It integrates computation, visualisation and programming usin Matlab notes Matlab is a matrix-based, high-performance language for technical computing It integrates computation, visualisation and programming using familiar mathematical notation The name Matlab stands

More information

How to use the DEGseq Package

How to use the DEGseq Package How to use the DEGseq Package Likun Wang 1,2 and Xi Wang 1. October 30, 2018 1 MOE Key Laboratory of Bioinformatics and Bioinformatics Division, TNLIST /Department of Automation, Tsinghua University. 2

More information

Meeting 1 Introduction to Functions. Part 1 Graphing Points on a Plane (REVIEW) Part 2 What is a function?

Meeting 1 Introduction to Functions. Part 1 Graphing Points on a Plane (REVIEW) Part 2 What is a function? Meeting 1 Introduction to Functions Part 1 Graphing Points on a Plane (REVIEW) A plane is a flat, two-dimensional surface. We describe particular locations, or points, on a plane relative to two number

More information

Section 4 General Factorial Tutorials

Section 4 General Factorial Tutorials Section 4 General Factorial Tutorials General Factorial Part One: Categorical Introduction Design-Ease software version 6 offers a General Factorial option on the Factorial tab. If you completed the One

More information

Expander Online Documentation

Expander Online Documentation Expander Online Documentation Table of Contents Introduction...1 Starting EXPANDER...2 Input Data...4 Preprocessing GE Data...8 Viewing Data Plots...12 Clustering GE Data...14 Biclustering GE Data...17

More information

Charts in Excel 2003

Charts in Excel 2003 Charts in Excel 2003 Contents Introduction Charts in Excel 2003...1 Part 1: Generating a Basic Chart...1 Part 2: Adding Another Data Series...3 Part 3: Other Handy Options...5 Introduction Charts in Excel

More information

AB1700 Microarray Data Analysis

AB1700 Microarray Data Analysis AB1700 Microarray Data Analysis Yongming Andrew Sun, Applied Biosystems sunya@appliedbiosystems.com October 30, 2017 Contents 1 ABarray Package Introduction 2 1.1 Required Files and Format.........................................

More information

Package cornai. R topics documented: April 14, Type Package Title Analysis of co-knock-down RNAi data Version Author Elin Axelsson

Package cornai. R topics documented: April 14, Type Package Title Analysis of co-knock-down RNAi data Version Author Elin Axelsson Type Package Title Analysis of co-knock-down RNAi data Version 1.24.0 Author Package cornai April 14, 2017 Maintainer Analysis of combinatorial cell-based RNAi screens License

More information

The crosshybdetector Package

The crosshybdetector Package The crosshybdetector Package July 31, 2007 Type Package Title Detection of cross-hybridization events in microarray experiments Version 1.0.1 Date 2007-07-31 Author Maintainer

More information

What does analyze.itraq( )?

What does analyze.itraq( )? What does analyze.itraq( )? Oct. 22, 2012 Lisa Chung R function, do.itraq( ) is written to take one run of 4- plex or 8- plex itraq experiment. It performs cyclic- loess normalization [ref] and pair- wise

More information

Lecture 3 - Template and Vectors

Lecture 3 - Template and Vectors Lecture - Template and Vectors Homework Format and Template: We ll each develop a simple template to use to start any new homework. The idea of a template is to layout the basic structure of what goes

More information

A short reference to FSPMA definition files

A short reference to FSPMA definition files A short reference to FSPMA definition files P. Sykacek Department of Genetics & Department of Pathology University of Cambridge peter@sykacek.net June 22, 2005 Abstract This report provides a brief reference

More information

TIGR MIDAS Version 2.19 TIGR MIDAS. Microarray Data Analysis System. Version 2.19 November Page 1 of 85

TIGR MIDAS Version 2.19 TIGR MIDAS. Microarray Data Analysis System. Version 2.19 November Page 1 of 85 TIGR MIDAS Microarray Data Analysis System Version 2.19 November 2004 Page 1 of 85 Table of Contents 1 General Information...4 1.1 Obtaining MIDAS... 4 1.2 Referencing MIDAS... 4 1.3 A note on non-windows

More information

Gene signature selection to predict survival benefits from adjuvant chemotherapy in NSCLC patients

Gene signature selection to predict survival benefits from adjuvant chemotherapy in NSCLC patients 1 Gene signature selection to predict survival benefits from adjuvant chemotherapy in NSCLC patients 1,2 Keyue Ding, Ph.D. Nov. 8, 2014 1 NCIC Clinical Trials Group, Kingston, Ontario, Canada 2 Dept. Public

More information

by Stuart David James McHattie Supervised by Katherine Denby, Vicky Buchanan-Wollaston and Andrew Mead of Warwick HRI

by Stuart David James McHattie Supervised by Katherine Denby, Vicky Buchanan-Wollaston and Andrew Mead of Warwick HRI by Stuart David James McHattie Supervised by Katherine Denby, Vicky Buchanan-Wollaston and Andrew Mead of Warwick HRI Table of Contents Table of Contents...2 Introduction...4 Experimental Design...4 The

More information

Why use R? Getting started. Why not use R? Introduction to R: Log into tak. Start R R or. It s hard to use at first

Why use R? Getting started. Why not use R? Introduction to R: Log into tak. Start R R or. It s hard to use at first Why use R? Introduction to R: Using R for statistics ti ti and data analysis BaRC Hot Topics October 2011 George Bell, Ph.D. http://iona.wi.mit.edu/bio/education/r2011/ To perform inferential statistics

More information

OECD QSAR Toolbox v.4.1. Example illustrating endpoint vs. endpoint correlation using ToxCast data

OECD QSAR Toolbox v.4.1. Example illustrating endpoint vs. endpoint correlation using ToxCast data OECD QSAR Toolbox v.4.1 Example illustrating endpoint vs. endpoint correlation using ToxCast data Outlook Background Objectives The exercise Workflow 2 Background This presentation is designed to introduce

More information

Using R for statistics and data analysis

Using R for statistics and data analysis Introduction ti to R: Using R for statistics and data analysis BaRC Hot Topics October 2011 George Bell, Ph.D. http://iona.wi.mit.edu/bio/education/r2011/ Why use R? To perform inferential statistics (e.g.,

More information

Tutorial - Analysis of Microarray Data. Microarray Core E Consortium for Functional Glycomics Funded by the NIGMS

Tutorial - Analysis of Microarray Data. Microarray Core E Consortium for Functional Glycomics Funded by the NIGMS Tutorial - Analysis of Microarray Data Microarray Core E Consortium for Functional Glycomics Funded by the NIGMS Data Analysis introduction Warning: Microarray data analysis is a constantly evolving science.

More information

Package TilePlot. February 15, 2013

Package TilePlot. February 15, 2013 Package TilePlot February 15, 2013 Type Package Title Characterization of functional genes in complex microbial communities using tiling DNA microarrays Version 1.3 Date 2011-05-04 Author Ian Marshall

More information

Towards an Optimized Illumina Microarray Data Analysis Pipeline

Towards an Optimized Illumina Microarray Data Analysis Pipeline Towards an Optimized Illumina Microarray Data Analysis Pipeline Pan Du, Simon Lin Robert H. Lurie Comprehensive Cancer Center, Northwestern University August 06, 2007 Outline Introduction of Illumina Beadarray

More information

Illuminating the Big Picture

Illuminating the Big Picture EE16A Imaging 2 Why? Imaging 1: Finding a link between physical quantities and voltage is powerful If you can digitize it, you can do anything (IOT devices, internet, code, processing) Imaging 2: What

More information

Package AgiMicroRna. R topics documented: November 9, Version

Package AgiMicroRna. R topics documented: November 9, Version Version 2.32.0 Package AgiMicroRna November 9, 2018 Title Processing and Differential Expression Analysis of Agilent microrna chips Author Maintainer Imports Biobase Depends

More information

Expander 7.2 Online Documentation

Expander 7.2 Online Documentation Expander 7.2 Online Documentation Introduction... 2 Starting EXPANDER... 2 Input Data... 3 Tabular Data File... 4 CEL Files... 6 Working on similarity data no associated expression data... 9 Working on

More information

Package matchbox. December 31, 2018

Package matchbox. December 31, 2018 Type Package Package matchbox December 31, 2018 Title Utilities to compute, compare, and plot the agreement between ordered vectors of features (ie. distinct genomic experiments). The package includes

More information

The Allen Human Brain Atlas offers three types of searches to allow a user to: (1) obtain gene expression data for specific genes (or probes) of

The Allen Human Brain Atlas offers three types of searches to allow a user to: (1) obtain gene expression data for specific genes (or probes) of Microarray Data MICROARRAY DATA Gene Search Boolean Syntax Differential Search Mouse Differential Search Search Results Gene Classification Correlative Search Download Search Results Data Visualization

More information

GeneSifter.Net User s Guide

GeneSifter.Net User s Guide GeneSifter.Net User s Guide 1 2 GeneSifter.Net Overview Login Upload Tools Pairwise Analysis Create Projects For more information about a feature see the corresponding page in the User s Guide noted in

More information

Your Name: Section: INTRODUCTION TO STATISTICAL REASONING Computer Lab #4 Scatterplots and Regression

Your Name: Section: INTRODUCTION TO STATISTICAL REASONING Computer Lab #4 Scatterplots and Regression Your Name: Section: 36-201 INTRODUCTION TO STATISTICAL REASONING Computer Lab #4 Scatterplots and Regression Objectives: 1. To learn how to interpret scatterplots. Specifically you will investigate, using

More information

Assignment 2 Ray Tracing

Assignment 2 Ray Tracing Assignment 2 Ray Tracing Overview The concept of ray tracing: a technique for generating an image by tracing the path of light through pixels in an image plane and simulating the effects of its encounters

More information

FlowJo Software Lecture Outline:

FlowJo Software Lecture Outline: FlowJo Software Lecture Outline: Workspace Basics: 3 major components 1) The Ribbons (toolbar) The availability of buttons here can be customized. *One of the best assets of FlowJo is the help feature*

More information

Methodology for spot quality evaluation

Methodology for spot quality evaluation Methodology for spot quality evaluation Semi-automatic pipeline in MAIA The general workflow of the semi-automatic pipeline analysis in MAIA is shown in Figure 1A, Manuscript. In Block 1 raw data, i.e..tif

More information

ECE 3793 Matlab Project 1

ECE 3793 Matlab Project 1 ECE 3793 Matlab Project 1 Spring 2017 Dr. Havlicek DUE: 02/04/2017, 11:59 PM Introduction: You will need to use Matlab to complete this assignment. So the first thing you need to do is figure out how you

More information

Package RTCGAToolbox

Package RTCGAToolbox Type Package Package RTCGAToolbox November 27, 2017 Title A new tool for exporting TCGA Firehose data Version 2.9.2 Author Mehmet Kemal Samur Maintainer Marcel Ramos Managing

More information

Package stepnorm. R topics documented: April 10, Version Date

Package stepnorm. R topics documented: April 10, Version Date Version 1.38.0 Date 2008-10-08 Package stepnorm April 10, 2015 Title Stepwise normalization functions for cdna microarrays Author Yuanyuan Xiao , Yee Hwa (Jean) Yang

More information

CQN (Conditional Quantile Normalization)

CQN (Conditional Quantile Normalization) CQN (Conditional Quantile Normalization) Kasper Daniel Hansen khansen@jhsph.edu Zhijin Wu zhijin_wu@brown.edu Modified: August 8, 2012. Compiled: April 30, 2018 Introduction This package contains the CQN

More information

Package plmde. February 20, 2015

Package plmde. February 20, 2015 Type Package Package plmde February 20, 2015 Title Additive partially linear models for differential gene expression analysis Version 1.0 Date 2012-05-01 Author Maintainer Jonas

More information

Graphing by. Points. The. Plotting Points. Line by the Plotting Points Method. So let s try this (-2, -4) (0, 2) (2, 8) many points do I.

Graphing by. Points. The. Plotting Points. Line by the Plotting Points Method. So let s try this (-2, -4) (0, 2) (2, 8) many points do I. Section 5.5 Graphing the Equation of a Line Graphing by Plotting Points Suppose I asked you to graph the equation y = x +, i.e. to draw a picture of the line that the equation represents. plotting points

More information

LAB #1: DESCRIPTIVE STATISTICS WITH R

LAB #1: DESCRIPTIVE STATISTICS WITH R NAVAL POSTGRADUATE SCHOOL LAB #1: DESCRIPTIVE STATISTICS WITH R Statistics (OA3102) Lab #1: Descriptive Statistics with R Goal: Introduce students to various R commands for descriptive statistics. Lab

More information

Analyzing Variant Call results using EuPathDB Galaxy, Part II

Analyzing Variant Call results using EuPathDB Galaxy, Part II Analyzing Variant Call results using EuPathDB Galaxy, Part II In this exercise, we will work in groups to examine the results from the SNP analysis workflow that we started yesterday. The first step is

More information

BIOL 417: Biostatistics Laboratory #3 Tuesday, February 8, 2011 (snow day February 1) INTRODUCTION TO MYSTAT

BIOL 417: Biostatistics Laboratory #3 Tuesday, February 8, 2011 (snow day February 1) INTRODUCTION TO MYSTAT BIOL 417: Biostatistics Laboratory #3 Tuesday, February 8, 2011 (snow day February 1) INTRODUCTION TO MYSTAT Go to the course Blackboard site and download Laboratory 3 MYSTAT Intro.xls open this file in

More information

TIGR ExpressConverter

TIGR ExpressConverter TIGR ExpressConverter (Version 1.7) January, 2005 Microarray Software Group The Institute for Genomic Research Table of Contents Introduction ---------------------------------------------------------------------------

More information

Install RStudio from - use the standard installation.

Install RStudio from   - use the standard installation. Session 1: Reading in Data Before you begin: Install RStudio from http://www.rstudio.com/ide/download/ - use the standard installation. Go to the course website; http://faculty.washington.edu/kenrice/rintro/

More information

Exploring IX1D The Terrain Conductivity/Resistivity Modeling Software

Exploring IX1D The Terrain Conductivity/Resistivity Modeling Software Exploring IX1D The Terrain Conductivity/Resistivity Modeling Software You can bring a shortcut to the modeling program IX1D onto your desktop by right-clicking the program in your start > all programs

More information

Package diffcyt. December 26, 2018

Package diffcyt. December 26, 2018 Version 1.2.0 Package diffcyt December 26, 2018 Title Differential discovery in high-dimensional cytometry via high-resolution clustering Description Statistical methods for differential discovery analyses

More information

Programming Exercise 3: Multi-class Classification and Neural Networks

Programming Exercise 3: Multi-class Classification and Neural Networks Programming Exercise 3: Multi-class Classification and Neural Networks Machine Learning Introduction In this exercise, you will implement one-vs-all logistic regression and neural networks to recognize

More information

CARLETON UNIVERSITY. Laboratory 2.0

CARLETON UNIVERSITY. Laboratory 2.0 CARLETON UNIVERSITY Department of Electronics ELEC 267 Switching Circuits Jan 3, 28 Overview Laboratory 2. A 3-Bit Binary Sign-Extended Adder/Subtracter A binary adder sums two binary numbers for example

More information

MAGE-ML: MicroArray Gene Expression Markup Language

MAGE-ML: MicroArray Gene Expression Markup Language MAGE-ML: MicroArray Gene Expression Markup Language Links: - Full MAGE specification: http://cgi.omg.org/cgi-bin/doc?lifesci/01-10-01 - MAGE-ML Document Type Definition (DTD): http://cgi.omg.org/cgibin/doc?lifesci/01-11-02

More information

Using Charts in a Presentation 6

Using Charts in a Presentation 6 Using Charts in a Presentation 6 LESSON SKILL MATRIX Skill Exam Objective Objective Number Building Charts Create a chart. Import a chart. Modifying the Chart Type and Data Change the Chart Type. 3.2.3

More information