Haskell Hierarchical LibrariesContentsIndex
Haskell Hierarchical Libraries

The libraries are divided into several packages. The available package 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.
haskell98
This package contains the Haskell 98 Standard and FFI Standard Libraries. For more information on the Haskell 98 Standard Libraries, please see the Haskell 98 Library Report, here: http://www.haskell.org/onlinelibrary/.
haskell-src
Facilities for manipulating Haskell source code: an abstract syntax, lexer, parser and pretty-printer.
network
Networking-related facilities.
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://cnswww.cns.cwru.edu/~chet/readline/rltop.html.
unix
POSIX functionality.

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/users-guide.html) for more details.
Hugs
Hugs provides almost all of the modules in the 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, as a single hierarchy; Hugs does not use the package subdivision.
Nhc98
Nhc98 provides many of the modules in the 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
Arrayhaskell98
Bitshaskell98
CErrorhaskell98
CForeignhaskell98
CPUTimehaskell98
CStringhaskell98
CTypeshaskell98
Charhaskell98
Complexhaskell98
Control
Control.Arrowbase
Control.Concurrentbase
Control.Concurrent.Chanbase
Control.Concurrent.MVarbase
Control.Concurrent.QSembase
Control.Concurrent.QSemNbase
Control.Concurrent.SampleVarbase
Control.Exceptionbase
Control.Monadbase
Control.Monad.Contbase
Control.Monad.Errorbase
Control.Monad.Fixbase
Control.Monad.Identitybase
Control.Monad.Listbase
Control.Monad.RWSbase
Control.Monad.Readerbase
Control.Monad.STbase
Control.Monad.ST.Lazybase
Control.Monad.ST.Strictbase
Control.Monad.Statebase
Control.Monad.Transbase
Control.Monad.Writerbase
Control.Parallelbase
Data
Data.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
Data.Charbase
Data.Complexbase
Data.Dynamicbase
Data.Eitherbase
Data.FiniteMapbase
Data.Genericsbase
Data.Generics.Aliasesbase
Data.Generics.Basicsbase
Data.Generics.Reifybase
Data.Generics.Schemesbase
Data.Generics.Textbase
Data.Generics.Twinsbase
Data.Graphbase
Data.HashTablebase
Data.IORefbase
Data.Intbase
Data.Ixbase
Data.Listbase
Data.Maybebase
Data.Monoidbase
Data.PackedStringbase
Data.Ratiobase
Data.STRefbase
Data.STRef.Lazybase
Data.STRef.Strictbase
Data.Setbase
Data.Treebase
Data.Tuplebase
Data.Typeablebase
Data.Uniquebase
Data.Wordbase
Debug
Debug.QuickCheckQuickCheck
Debug.QuickCheck.BatchQuickCheck
Debug.QuickCheck.PolyQuickCheck
Debug.QuickCheck.UtilsQuickCheck
Debug.Tracebase
Directoryhaskell98
Foreignbase
Foreign.Cbase
Foreign.C.Errorbase
Foreign.C.Stringbase
Foreign.C.Typesbase
Foreign.Concurrentbase
Foreign.ForeignPtrbase
Foreign.Marshalbase
Foreign.Marshal.Allocbase
Foreign.Marshal.Arraybase
Foreign.Marshal.Errorbase
Foreign.Marshal.Poolbase
Foreign.Marshal.Utilsbase
Foreign.Ptrbase
Foreign.StablePtrbase
Foreign.Storablebase
ForeignPtrhaskell98
GHC
GHC.Arrbase
GHC.Basebase
GHC.Concbase
GHC.Dotnetbase
GHC.Enumbase
GHC.Errbase
GHC.Exceptionbase
GHC.Extsbase
GHC.Floatbase
GHC.ForeignPtrbase
GHC.Handlebase
GHC.IObase
GHC.IOBasebase
GHC.Intbase
GHC.Listbase
GHC.Numbase
GHC.Packbase
GHC.Ptrbase
GHC.Readbase
GHC.Realbase
GHC.STbase
GHC.STRefbase
GHC.Showbase
GHC.Stablebase
GHC.Storablebase
GHC.TopHandlerbase
GHC.Unicodebase
GHC.Weakbase
GHC.Wordbase
IOhaskell98
Inthaskell98
Ixhaskell98
Language
Haskell
Language.Haskell.Parserhaskell-src
Language.Haskell.Prettyhaskell-src
Language.Haskell.Syntaxhaskell-src
Language.Haskell.THSyntaxhaskell-src
Listhaskell98
Localehaskell98
MarshalAllochaskell98
MarshalArrayhaskell98
MarshalErrorhaskell98
MarshalUtilshaskell98
Maybehaskell98
Monadhaskell98
Networknetwork
Network.BSDnetwork
Network.CGInetwork
Network.Socketnetwork
Network.URInetwork
Numericbase
Preludebase
Ptrhaskell98
Randomhaskell98
Ratiohaskell98
StablePtrhaskell98
Storablehaskell98
Systemhaskell98
System.CPUTimebase
System.Cmdbase
Console
System.Console.GetOptbase
System.Console.Readlinereadline
System.Console.SimpleLineEditorreadline
System.Directorybase
System.Environmentbase
System.Exitbase
System.IObase
System.IO.Errorbase
System.IO.Unsafebase
System.Infobase
System.Localebase
System.Membase
System.Mem.StableNamebase
System.Mem.Weakbase
System.Posixunix
System.Posix.Directoryunix
System.Posix.DynamicLinkerunix
System.Posix.DynamicLinker.Moduleunix
System.Posix.DynamicLinker.Primunix
System.Posix.Envunix
System.Posix.Filesunix
System.Posix.IOunix
System.Posix.Processunix
System.Posix.Resourceunix
System.Posix.Signalsbase
System.Posix.Tempunix
System.Posix.Terminalunix
System.Posix.Timeunix
System.Posix.Typesbase
System.Posix.Unistdunix
System.Posix.Userunix
System.Randombase
System.Timebase
Text
Text.Htmlbase
Text.Html.BlockTablebase
ParserCombinators
Text.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
Text.PrettyPrintbase
Text.PrettyPrint.HughesPJbase
Text.Readbase
Text.Read.Lexbase
Text.Regexbase
Text.Regex.Posixbase
Text.Showbase
Text.Show.Functionsbase
Timehaskell98
Wordhaskell98
Produced by Haddock version 0.6