Haskell Hierarchical LibrariesContentsIndex
Haskell Hierarchical Libraries

The libraries are divided into several packages. The available packages are:

base
This package contains the Prelude and its support libraries, and a large collection of useful libraries ranging from data structures to parsing combinators and debugging utilities.
Cabal
The Haskell Cabal is the Common Architecture for Building Applications and Libraries. It is a framework which defines a common interface for authors to more easily build their applications in a portable way. The Haskell Cabal is meant to be a part of a larger infrastructure for distributing, organizing, and cataloging Haskell Libraries and Tools. For more information, please see: http://www.haskell.org/cabal/.
cgi
A library for writing CGI programs.
fgl
Martin Erwig's Functional Graph Library.
GLUT
The GLUT package contains a Haskell binding for the OpenGL Utility Toolkit, a window system independent toolkit for writing OpenGL programs. For more information about the C library on which this binding is based, please see: http://www.opengl.org/resources/libraries/glut/.
haskell98
This package provides compatibility with the modules of Haskell 98 and the FFI addendum, by means of wrappers around modules from the base package (which in many cases have additional features). However Prelude, Numeric and Foreign are provided directly by the base package. The modules of this package are documented in the Revised Haskell 98 Report, at http://www.haskell.org/onlinereport/, and the Haskell 98 Foreign Function Interface addendum, at http://www.cse.unsw.edu.au/~chak/haskell/ffi/.
haskell-src
Facilities for manipulating Haskell source code: an abstract syntax, lexer, parser and pretty-printer.
HGL
A simple graphics library, designed to give the programmer access to most interesting parts of the Win32 Graphics Device Interface and X11 library without exposing the programmer to the pain and anguish usually associated with using these interfaces. Note: the Win32 part is not currently operational. The library also includes a module Graphics.SOE providing the interface used in The Haskell School of Expression, by Paul Hudak, cf http://www.haskell.org/soe/.
html
An Html combinator library.
HUnit
HUnit is a unit testing framework for Haskell, inspired by the JUnit tool for Java, see: http://www.junit.org.
mtl
A monad transformer library, inspired by the paper Functional Programming with Overloading and Higher-Order Polymorphism, Mark P Jones (http://www.cse.ogi.edu/~mpj/) Advanced School of Functional Programming, 1995.
network
Networking-related facilities.
OpenGL
The OpenGL package contains a Haskell binding for the OpenGL graphics system (GL, version 1.5) and its accompanying utility library (GLU, version 1.3). OpenGL is the industry's most widely used and supported 2D and 3D graphics application programming interface (API), incorporating a broad set of rendering, texture mapping, special effects, and other powerful visualization functions. For more information about OpenGL, please see: http://www.opengl.org/.
parsec
A monadic parser combinator library, written by Daan Leijen. Parsec is designed from scratch as an industrial-strength parser library. It is simple, safe, well documented, has extensive libraries and good error messages, and is also fast. More documentation can be found on: http://www.cs.uu.nl/~daan/parsec.html
QuickCheck
A library for testing Haskell programs automatically. The programmer provides a specification of the program, in the form of properties which functions should satisfy, and QuickCheck then tests that the properties hold in a large number of randomly generated cases. Specifications are expressed in Haskell, using combinators defined in the QuickCheck library. QuickCheck provides combinators to define properties, observe the distribution of test data, and define test data generators. For more information, please see: http://www.math.chalmers.se/~rjmh/QuickCheck/.
readline
An interface to the GNU readline library. More information on readline can be found at http://www.gnu.org/directory/readline.html.
regex-base
Interfaces for regular expressions
regex-compat
Compatibility for Text.Regex
regex-posix
POSIX regular expressions
stm
Software Transactional Memory: a modular composable concurrency abstraction.
template-haskell
Facilities for manipulating Haskell source code using Template Haskell.
time
Clock and calendar time.
unix
POSIX functionality.
X11
A Haskell binding to the X11 library. The binding is a direct translation of C binding; for documentation of these calls, refer to The Xlib Programming Manual, available online at http://tronche.com/gui/x/xlib/.
xhtml
An XHtml combinator library.

Implementation-specific notes:

GHC/GHCi
Most of the time, all the packages are available without the need to use any additional command-line options. The only time when this is not the case is when linking a program on the command line, without using the --make option: in this case you must list all the packages to link to by adding the -package P flag (where P is the package name) to the command line for each package. See the User's Guide (../users_guide/index.html) for more details.
Hugs
Hugs provides almost all of the modules in the above packages, with exceptions listed on the Hugs 98 libraries status page (http://cvs.haskell.org/Hugs/pages/libstatus.html). All those modules are always available.
Nhc98
Nhc98 provides many of the modules in the above packages (see the Nhc98 libraries page (http://www.haskell.org/nhc98/libraries.html) for a more details). The modules of the haskell98 package are available without the need to use any additional compile-time options. To use modules from some other package P with Nhc98, add the compile-time option -package P.
Modules
show/hideControl
Control.Applicativebase
Control.Arrowbase
show/hideControl.Concurrentbase
Control.Concurrent.Chanbase
Control.Concurrent.MVarbase
Control.Concurrent.QSembase
Control.Concurrent.QSemNbase
show/hideControl.Concurrent.STMstm
Control.Concurrent.STM.TArraystm
Control.Concurrent.STM.TChanstm
Control.Concurrent.STM.TMVarstm
Control.Concurrent.STM.TVarstm
Control.Concurrent.SampleVarbase
Control.Exceptionbase
show/hideControl.Monadbase
Control.Monad.Contmtl
Control.Monad.Errormtl
Control.Monad.Fixbase
Control.Monad.Identitymtl
Control.Monad.Instancesbase
Control.Monad.Listmtl
Control.Monad.RWSmtl
Control.Monad.Readermtl
show/hideControl.Monad.STbase
Control.Monad.ST.Lazybase
Control.Monad.ST.Strictbase
Control.Monad.STMstm
Control.Monad.Statemtl
Control.Monad.Transmtl
Control.Monad.Writermtl
show/hideControl.Parallelbase
Control.Parallel.Strategiesbase
show/hideData
show/hideData.Arraybase
Data.Array.Diffbase
Data.Array.IArraybase
Data.Array.IObase
Data.Array.MArraybase
Data.Array.STbase
Data.Array.Storablebase
Data.Array.Unboxedbase
Data.Bitsbase
Data.Boolbase
show/hideData.ByteStringbase
Data.ByteString.Basebase
Data.ByteString.Char8base
show/hideData.ByteString.Lazybase
Data.ByteString.Lazy.Char8base
Data.Charbase
Data.Complexbase
Data.Dynamicbase
Data.Eitherbase
Data.Eqbase
Data.Fixedbase
Data.Foldablebase
Data.FunctorMbase
show/hideData.Genericsbase
Data.Generics.Aliasesbase
Data.Generics.Basicsbase
Data.Generics.Instancesbase
Data.Generics.Schemesbase
Data.Generics.Textbase
Data.Generics.Twinsbase
show/hideData.Graphbase
show/hideData.Graph.Inductivefgl
Data.Graph.Inductive.Basicfgl
Data.Graph.Inductive.Examplefgl
Data.Graph.Inductive.Graphfgl
Data.Graph.Inductive.Graphvizfgl
show/hideInternal
Data.Graph.Inductive.Internal.FiniteMapfgl
Data.Graph.Inductive.Internal.Heapfgl
Data.Graph.Inductive.Internal.Queuefgl
Data.Graph.Inductive.Internal.RootPathfgl
Data.Graph.Inductive.Internal.Threadfgl
show/hideData.Graph.Inductive.Monadfgl
Data.Graph.Inductive.Monad.IOArrayfgl
Data.Graph.Inductive.NodeMapfgl
show/hideData.Graph.Inductive.Queryfgl
Data.Graph.Inductive.Query.ArtPointfgl
Data.Graph.Inductive.Query.BCCfgl
Data.Graph.Inductive.Query.BFSfgl
Data.Graph.Inductive.Query.DFSfgl
Data.Graph.Inductive.Query.Dominatorsfgl
Data.Graph.Inductive.Query.GVDfgl
Data.Graph.Inductive.Query.Indepfgl
Data.Graph.Inductive.Query.MSTfgl
Data.Graph.Inductive.Query.MaxFlowfgl
Data.Graph.Inductive.Query.MaxFlow2fgl
Data.Graph.Inductive.Query.Monadfgl
Data.Graph.Inductive.Query.SPfgl
Data.Graph.Inductive.Query.TransClosfgl
Data.Graph.Inductive.Treefgl
Data.HashTablebase
Data.IORefbase
Data.Intbase
Data.IntMapbase
Data.IntSetbase
Data.Ixbase
Data.Listbase
Data.Mapbase
Data.Maybebase
Data.Monoidbase
Data.Ordbase
Data.PackedStringbase
Data.Queuebase
Data.Ratiobase
show/hideData.STRefbase
Data.STRef.Lazybase
Data.STRef.Strictbase
Data.Sequencebase
Data.Setbase
show/hideData.Timetime
show/hideData.Time.Calendartime
Data.Time.Calendar.Eastertime
Data.Time.Calendar.Juliantime
Data.Time.Calendar.MonthDaytime
Data.Time.Calendar.OrdinalDatetime
Data.Time.Calendar.WeekDatetime
show/hideData.Time.Clocktime
Data.Time.Clock.POSIXtime
Data.Time.Clock.TAItime
Data.Time.LocalTimetime
Data.Traversablebase
Data.Treebase
Data.Tuplebase
Data.Typeablebase
Data.Uniquebase
Data.Versionbase
Data.Wordbase
show/hideDebug
show/hideDebug.QuickCheckQuickCheck
Debug.QuickCheck.BatchQuickCheck
Debug.QuickCheck.PolyQuickCheck
Debug.QuickCheck.UtilsQuickCheck
Debug.Tracebase
show/hideDistribution
show/hideCompat
Distribution.Compat.ReadPCabal
Distribution.CompilerCabal
Distribution.ExtensionCabal
Distribution.InstalledPackageInfoCabal
Distribution.LicenseCabal
Distribution.MakeCabal
Distribution.PackageCabal
Distribution.PackageDescriptionCabal
show/hideDistribution.PreProcessCabal
Distribution.PreProcess.UnlitCabal
Distribution.ProgramCabal
Distribution.SetupCabal
show/hideDistribution.SimpleCabal
Distribution.Simple.BuildCabal
Distribution.Simple.ConfigureCabal
Distribution.Simple.GHCCabal
Distribution.Simple.GHCPackageConfigCabal
Distribution.Simple.HugsCabal
Distribution.Simple.InstallCabal
Distribution.Simple.JHCCabal
Distribution.Simple.LocalBuildInfoCabal
Distribution.Simple.NHCCabal
Distribution.Simple.RegisterCabal
Distribution.Simple.SrcDistCabal
Distribution.Simple.UtilsCabal
Distribution.VersionCabal
show/hideForeignbase
show/hideForeign.Cbase
Foreign.C.Errorbase
Foreign.C.Stringbase
Foreign.C.Typesbase
Foreign.Concurrentbase
Foreign.ForeignPtrbase
show/hideForeign.Marshalbase
Foreign.Marshal.Allocbase
Foreign.Marshal.Arraybase
Foreign.Marshal.Errorbase
Foreign.Marshal.Poolbase
Foreign.Marshal.Utilsbase
Foreign.Ptrbase
Foreign.StablePtrbase
Foreign.Storablebase
show/hideGHC
GHC.Concbase
GHC.ConsoleHandlerbase
GHC.Dotnetbase
GHC.Dynamicbase
GHC.Extsbase
GHC.Primbase
show/hideGraphics
show/hideGraphics.HGLHGL
Graphics.HGL.CoreHGL
show/hideGraphics.HGL.DrawHGL
Graphics.HGL.Draw.BrushHGL
Graphics.HGL.Draw.FontHGL
Graphics.HGL.Draw.MonadHGL
Graphics.HGL.Draw.PenHGL
Graphics.HGL.Draw.PictureHGL
Graphics.HGL.Draw.RegionHGL
Graphics.HGL.Draw.TextHGL
Graphics.HGL.KeyHGL
Graphics.HGL.RunHGL
Graphics.HGL.UnitsHGL
Graphics.HGL.UtilsHGL
Graphics.HGL.WindowHGL
show/hideRendering
show/hideGraphics.Rendering.OpenGLOpenGL
show/hideGraphics.Rendering.OpenGL.GLOpenGL
Graphics.Rendering.OpenGL.GL.AntialiasingOpenGL
Graphics.Rendering.OpenGL.GL.BasicTypesOpenGL
Graphics.Rendering.OpenGL.GL.BeginEndOpenGL
Graphics.Rendering.OpenGL.GL.BitmapsOpenGL
Graphics.Rendering.OpenGL.GL.BufferObjectsOpenGL
Graphics.Rendering.OpenGL.GL.ClippingOpenGL
Graphics.Rendering.OpenGL.GL.ColorSumOpenGL
Graphics.Rendering.OpenGL.GL.ColorsOpenGL
Graphics.Rendering.OpenGL.GL.CoordTransOpenGL
Graphics.Rendering.OpenGL.GL.DisplayListsOpenGL
Graphics.Rendering.OpenGL.GL.EvaluatorsOpenGL
Graphics.Rendering.OpenGL.GL.FeedbackOpenGL
Graphics.Rendering.OpenGL.GL.FlushFinishOpenGL
Graphics.Rendering.OpenGL.GL.FogOpenGL
Graphics.Rendering.OpenGL.GL.FramebufferOpenGL
Graphics.Rendering.OpenGL.GL.HintsOpenGL
Graphics.Rendering.OpenGL.GL.LineSegmentsOpenGL
Graphics.Rendering.OpenGL.GL.PerFragmentOpenGL
show/hideGraphics.Rendering.OpenGL.GL.PixelRectanglesOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.ColorTableOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.ConvolutionOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.HistogramOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.MinmaxOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.PixelMapOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.PixelStorageOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.PixelTransferOpenGL
Graphics.Rendering.OpenGL.GL.PixelRectangles.RasterizationOpenGL
Graphics.Rendering.OpenGL.GL.PointsOpenGL
Graphics.Rendering.OpenGL.GL.PolygonsOpenGL
Graphics.Rendering.OpenGL.GL.RasterPosOpenGL
Graphics.Rendering.OpenGL.GL.ReadCopyPixelsOpenGL
Graphics.Rendering.OpenGL.GL.RectanglesOpenGL
Graphics.Rendering.OpenGL.GL.SavingStateOpenGL
Graphics.Rendering.OpenGL.GL.SelectionOpenGL
Graphics.Rendering.OpenGL.GL.StateVarOpenGL
Graphics.Rendering.OpenGL.GL.StringQueriesOpenGL
show/hideGraphics.Rendering.OpenGL.GL.TexturingOpenGL
Graphics.Rendering.OpenGL.GL.Texturing.ApplicationOpenGL
Graphics.Rendering.OpenGL.GL.Texturing.EnvironmentsOpenGL
Graphics.Rendering.OpenGL.GL.Texturing.ObjectsOpenGL
Graphics.Rendering.OpenGL.GL.Texturing.ParametersOpenGL
Graphics.Rendering.OpenGL.GL.Texturing.QueriesOpenGL
Graphics.Rendering.OpenGL.GL.Texturing.SpecificationOpenGL
Graphics.Rendering.OpenGL.GL.VertexArraysOpenGL
Graphics.Rendering.OpenGL.GL.VertexSpecOpenGL
show/hideGraphics.Rendering.OpenGL.GLUOpenGL
Graphics.Rendering.OpenGL.GLU.ErrorsOpenGL
Graphics.Rendering.OpenGL.GLU.InitializationOpenGL
Graphics.Rendering.OpenGL.GLU.MatrixOpenGL
Graphics.Rendering.OpenGL.GLU.MipmappingOpenGL
Graphics.Rendering.OpenGL.GLU.NURBSOpenGL
Graphics.Rendering.OpenGL.GLU.QuadricsOpenGL
Graphics.Rendering.OpenGL.GLU.TessellationOpenGL
Graphics.SOEHGL
show/hideUI
show/hideGraphics.UI.GLUTGLUT
Graphics.UI.GLUT.BeginGLUT
show/hideGraphics.UI.GLUT.CallbacksGLUT
Graphics.UI.GLUT.Callbacks.GlobalGLUT
Graphics.UI.GLUT.Callbacks.WindowGLUT
Graphics.UI.GLUT.ColormapGLUT
Graphics.UI.GLUT.DebuggingGLUT
Graphics.UI.GLUT.DeviceControlGLUT
Graphics.UI.GLUT.FontsGLUT
Graphics.UI.GLUT.GameModeGLUT
Graphics.UI.GLUT.InitializationGLUT
Graphics.UI.GLUT.MenuGLUT
Graphics.UI.GLUT.ObjectsGLUT
Graphics.UI.GLUT.OverlayGLUT
Graphics.UI.GLUT.StateGLUT
Graphics.UI.GLUT.WindowGLUT
show/hideX11
Graphics.X11.TypesX11
show/hideGraphics.X11.XlibX11
Graphics.X11.Xlib.AtomX11
Graphics.X11.Xlib.ColorX11
Graphics.X11.Xlib.ContextX11
Graphics.X11.Xlib.DisplayX11
Graphics.X11.Xlib.EventX11
Graphics.X11.Xlib.FontX11
Graphics.X11.Xlib.MiscX11
Graphics.X11.Xlib.RegionX11
Graphics.X11.Xlib.ScreenX11
Graphics.X11.Xlib.WindowX11
show/hideLanguage
show/hideHaskell
Language.Haskell.ExtensionCabal
Language.Haskell.Parserhaskell-src
Language.Haskell.Prettyhaskell-src
Language.Haskell.Syntaxhaskell-src
show/hideLanguage.Haskell.THtemplate-haskell
Language.Haskell.TH.Libtemplate-haskell
Language.Haskell.TH.Pprtemplate-haskell
Language.Haskell.TH.PprLibtemplate-haskell
Language.Haskell.TH.Syntaxtemplate-haskell
MainCabal
show/hideNetworknetwork
Network.BSDnetwork
show/hideNetwork.CGIcgi
Network.CGI.Compatcgi
Network.CGI.Cookiecgi
Network.CGI.Monadcgi
Network.CGI.Protocolcgi
Network.Socketnetwork
Network.URInetwork
Numericbase
Preludebase
show/hideSystem
System.CPUTimebase
System.Cmdbase
show/hideConsole
System.Console.GetOptbase
System.Console.Readlinereadline
System.Console.SimpleLineEditorreadline
System.Directorybase
System.Environmentbase
System.Exitbase
show/hideSystem.IObase
System.IO.Errorbase
System.IO.Unsafebase
System.Infobase
System.Localebase
show/hideSystem.Membase
System.Mem.StableNamebase
System.Mem.Weakbase
show/hideSystem.Posixunix
System.Posix.Directoryunix
show/hideSystem.Posix.DynamicLinkerunix
System.Posix.DynamicLinker.Moduleunix
System.Posix.DynamicLinker.Primunix
System.Posix.Envunix
System.Posix.Errorunix
System.Posix.Filesunix
System.Posix.IOunix
System.Posix.Processunix
System.Posix.Resourceunix
show/hideSystem.Posix.Signalsbase
System.Posix.Signals.Extsunix
System.Posix.Tempunix
System.Posix.Terminalunix
System.Posix.Timeunix
System.Posix.Typesbase
System.Posix.Unistdunix
System.Posix.Userunix
System.Processbase
System.Randombase
System.Timebase
show/hideTest
show/hideTest.HUnitHUnit
Test.HUnit.BaseHUnit
Test.HUnit.LangHUnit
Test.HUnit.TerminalHUnit
Test.HUnit.TextHUnit
show/hideTest.QuickCheckQuickCheck
Test.QuickCheck.BatchQuickCheck
Test.QuickCheck.PolyQuickCheck
Test.QuickCheck.UtilsQuickCheck
show/hideText
show/hideText.Htmlhtml
Text.Html.BlockTablehtml
show/hideParserCombinators
show/hideText.ParserCombinators.Parsecparsec
Text.ParserCombinators.Parsec.Charparsec
Text.ParserCombinators.Parsec.Combinatorparsec
Text.ParserCombinators.Parsec.Errorparsec
Text.ParserCombinators.Parsec.Exprparsec
Text.ParserCombinators.Parsec.Languageparsec
Text.ParserCombinators.Parsec.Permparsec
Text.ParserCombinators.Parsec.Posparsec
Text.ParserCombinators.Parsec.Primparsec
Text.ParserCombinators.Parsec.Tokenparsec
Text.ParserCombinators.ReadPbase
Text.ParserCombinators.ReadPrecbase
show/hideText.PrettyPrintbase
Text.PrettyPrint.HughesPJbase
Text.Printfbase
show/hideText.Readbase
Text.Read.Lexbase
show/hideText.Regexregex-compat
show/hideText.Regex.Baseregex-base
Text.Regex.Base.Contextregex-base
Text.Regex.Base.Implregex-base
Text.Regex.Base.RegexLikeregex-base
show/hideText.Regex.Posixregex-posix
Text.Regex.Posix.ByteStringregex-posix
Text.Regex.Posix.Stringregex-posix
Text.Regex.Posix.Wrapregex-posix
show/hideText.Showbase
Text.Show.Functionsbase
show/hideText.XHtmlxhtml
Text.XHtml.Debugxhtml
Text.XHtml.Framesetxhtml
Text.XHtml.Strictxhtml
Text.XHtml.Tablexhtml
Text.XHtml.Transitionalxhtml
Produced by Haddock version 0.8