Difference between revisions of "Cookbook"

From HaskellWiki
Jump to navigation Jump to search
m
(Added link to similar F# cookbook)
 
(209 intermediate revisions by 22 users not shown)
Line 1: Line 1:
  +
== Haskell Cookbook ==
  +
* [[Cookbook/Compilers and interpreters|Haskell compilers and interpreters]]
  +
* [[Cookbook/Numbers|Numbers]]
  +
* [[Cookbook/Lists and strings|Lists and strings]]
  +
* [[Cookbook/Other data structures|Other data structures]]
  +
* [[Cookbook/Dates And Time|Dates and time]]
  +
* [[Cookbook/Pattern matching|Pattern matching]]
  +
* [[Cookbook/Interactivity|Interactivity]]
  +
* [[Cookbook/Files|Files]]
  +
* [[Cookbook/Network programming|Network programming]]
  +
* [[Cookbook/XML|XML]]
  +
* [[Cookbook/Databases access|Databases access]]
  +
* [[Cookbook/Graphical user interfaces|Graphical user interfaces]]
  +
* [[Cookbook/PDF files|PDF files]]
  +
* [[Cookbook/FFI|FFI]]
  +
* [[Cookbook/Testing|Testing]]
  +
  +
== Similar projects for other programming languages ==
  +
* [http://cl-cookbook.sourceforge.net/ Common Lisp Cookbook]
  +
* [http://pleac.sourceforge.net/ PLEAC]
  +
* [http://www.zenspider.com/Languages/Ruby/Cookbook/index.html Ruby Cookbook]
  +
* [http://schemecookbook.org/Cookbook/WebHome Scheme Cookbook]
  +
* [http://fssnip.net/ F# Snippets]
  +
[[Category:FAQ]]
 
[[Category:How to]]
 
[[Category:How to]]
'''We need to start a GOOD (aka, not a [http://pleac.sourceforge.net PLEAC] clone) Haskell cookbook.
 
 
This page is based on the Scheme Cookbook at
 
http://schemecookbook.org/Cookbook/WebHome'''
 
== Prelude ==
 
 
A lot of functions are defined in the "[http://www.haskell.org/hoogle/?q=Prelude Prelude]". Also, if you ever want to search for a function, based on the name, type or module, take a look at the excellent [http://www.haskell.org/hoogle Hoogle]. This is for a lot of people a must-have while debugging and writing Haskell programs.
 
 
== GHCi/Hugs ==
 
=== GHCi interaction ===
 
To start GHCi from a command prompt, simply type `ghci'
 
 
$ ghci
 
___ ___ _
 
/ _ \ /\ /\/ __(_)
 
/ /_\// /_/ / / | | GHC Interactive, version 6.6, for Haskell 98.
 
/ /_\\/ __ / /___| | http://www.haskell.org/ghc/
 
\____/\/ /_/\____/|_| Type :? for help.
 
 
Loading package base ... linking ... done.
 
Prelude>
 
 
[http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html Prelude] is the "base" library of Haskell.
 
 
To create variables at the GHCi prompt, use `let'
 
<haskell>
 
Prelude> let x = 5
 
Prelude> x
 
5
 
Prelude> let y = 3
 
Prelude> y
 
3
 
Prelude> x + y
 
8
 
</haskell>
 
 
== Types ==
 
To check the type of an expression or function, use the command `:t'
 
<haskell>
 
Prelude> :t x
 
x :: Integer
 
Prelude> :t y
 
y :: Integer
 
</haskell>
 
Haskell has the following types defined in the [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html Standard Prelude].
 
<haskell>
 
Int -- bounded, word-sized integers
 
Integer -- unbounded integers
 
Double -- floating point values
 
Char -- characters
 
String -- strings are lists of characters
 
() -- the unit type
 
Bool -- booleans
 
[a] -- lists
 
(a,b) -- tuples / product types
 
Either a b -- sum types
 
Maybe a -- optional values
 
</haskell>
 
 
== Strings ==
 
=== Input ===
 
Strings can be read as input using [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3AgetLine getLine].
 
<haskell>
 
Prelude> getLine
 
Foo bar baz
 
"Foo bar baz"
 
</haskell>
 
 
=== Output ===
 
Strings can be output in a number of different ways.
 
<haskell>
 
Prelude> putStr "Foo"
 
FooPrelude>
 
</haskell>
 
As you can see, [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3AputStr putStr] does not include the newline character `\n'. We can either use putStr like this:
 
<haskell>
 
Prelude> putStr "Foo\n"
 
Foo
 
</haskell>
 
Or use [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3AputStrLn putStrLn], which is already in the Standard Prelude
 
<haskell>
 
Prelude> putStrLn "Foo"
 
Foo
 
</haskell>
 
We can also use [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3Aprint print] to print a string, '''including the quotation marks.'''
 
<haskell>
 
Prelude> print "Foo"
 
"Foo"
 
</haskell>
 
 
=== Concatenation ===
 
Concatenation of strings (or any other list) is done with the `++' operator.
 
<haskell>
 
Prelude> "foo" ++ "bar"
 
"foobar"
 
</haskell>
 
 
=== Regular expressions ===
 
=== Interpolation ===
 
=== Performance ===
 
=== Unicode (?) ===
 
 
 
== Numbers ==
 
Numbers in Haskell can be of the type <hask>Int, Integer, Float, Double, or Rational</hask>.
 
=== Random numbers ===
 
 
== Dates and time ==
 
Use [http://haskell.org/ghc/docs/latest/html/libraries/base/System-Time.html#v%3AgetClockTime System.Time.getClockTime] to get a properly formatted date stamp.
 
 
<haskell>
 
Prelude> System.Time.getClockTime
 
Wed Feb 21 20:05:35 CST 2007
 
</haskell>
 
 
== Lists ==
 
In Haskell, lists are what Arrays are in most other languages. Haskell has all of the general list manipulation functions, see also <hask>Data.List</hask>.
 
 
<haskell>
 
Prelude> head [1,2,3]
 
1
 
 
Prelude> tail [1,2,3]
 
[2,3]
 
 
Prelude> length [1,2,3]
 
3
 
</haskell>
 
 
Furthermore, Haskell supports some neat concepts.
 
 
===Infinite lists===
 
<haskell>
 
Prelude> [1..]
 
</haskell>
 
 
The list of all squares:
 
<haskell>
 
square x = x*x
 
squares = map square [1..]
 
</haskell>
 
 
But in the end, you probably don't want to use infinite lists, but make them finite. You can do this with <hask>take</hask>:
 
 
<haskell>
 
Prelude> take 10 squares
 
[1,4,9,16,25,36,49,64,81,100]
 
</haskell>
 
 
===List Comprehensions===
 
 
The list of all squares can also be written in a more comprehensive way, using list comprehensions:
 
 
<haskell>
 
squares = [x*x | x <- [1..]]
 
</haskell>
 
 
== Pattern matching ==
 
Haskell does implicit pattern matching.
 
 
A good example of pattern matching is done in the fact function for finding a factorial.
 
<haskell>
 
fact :: Integer -> Integer
 
fact 0 = 1
 
fact n = n * fact (n - 1)
 
</haskell>
 
In this function, <hask>fact :: Integer -> Integer</hask> is the functions type definition.
 
 
The next line, <hask>fact 0 = 1</hask> is a pattern match, so when the argument to the function fact is 0, the return value is 1.
 
 
The 3rd and final line of this function is another pattern match, which says that, whatever number was entered as the argument, is multiplied by the factorial of that number, minus 1. Notice this function is recursive.
 
 
Pattern matching in Haskell evaluates the patterns in the order they are written, so <hask>fact 0 = 1</hask> is evaluated before <hask>fact n = n * fact (n - 1)</hask>.
 
 
== Files ==
 
=== Simple IO ===
 
Using <hask>interact :: (String -> String) -> IO ()</hask>, you can easily do things with stdin and stdout.
 
 
A program to sum up numbers:
 
 
<haskell>main = interact $ show . sum . map read . lines</haskell>
 
 
A program that adds line numbers to each line:
 
 
<haskell>
 
main = interact numberLines
 
numberLines = unlines . zipWith combine [1..] . lines
 
where combine lineNumber text = concat [show lineNumber, " ", text]
 
</haskell>
 
 
=== Reading from files ===
 
The System.IO library contains the functions needed for file IO. The program
 
below displays the contents of the file c:\test.txt.
 
 
<haskell>
 
import System.IO
 
 
main = do
 
h <- openFile "c:\\test.txt" ReadMode
 
contents <- hGetContents h
 
putStrLn contents
 
hClose h
 
</haskell>
 
 
The same program, with some higher-lever functions:
 
 
<haskell>
 
main = do
 
contents <- readFile "c:\\test.txt"
 
putStrLn contents
 
</haskell>
 
=== Writing to files ===
 
 
The following program writes the first 100 squares to a file:
 
<haskell>
 
-- generate a list of squares with length 'num' in string-format.
 
numbers num = unlines $ take num $ map (show . \x -> x*x) [1..]
 
 
main = do
 
writeFile "test.txt" (numbers 100)
 
putStrLn "successfully written"
 
</haskell>
 
 
This will override the old contents of the file, or create a new file if the file doesn't exist yet. If you want to append to a file, you can use <hask>appendFile</hask>.
 
 
== Data Structures ==
 
 
GHC comes with some handy data-structures by default. If you want to use a Map, use [http://haskell.org/ghc/docs/latest/html/libraries/base/Data-Map.html Data.Map]. For sets, you can use Data.Set. A good way to find efficient data-structures is to take a look at the hierarchical libraries, see [http://haskell.org/ghc/docs/latest/html/libraries/index.html Haskell Hierarchical Libraries] and scroll down to 'Data'.
 
 
=== Map ===
 
=== Set ===
 
=== Tree ===
 
=== ByteString ===
 
 
=== Arrays ===
 
Arrays are generally eschewed in Haskell. However, they are useful if you desperately need constant lookup or update or if you have huge amounts of raw data.
 
 
[http://haskell.org/ghc/docs/latest/html/libraries/base/Data-Array-IArray.html Immutable arrays] like <hask>Data.Array.IArray.Array i e</hask> offer lookup in constant time but they get copied when you update an element. Use them if they can be filled in one go.
 
The following example groups a list of numbers according to their residual after division by <hask>n</hask> in one go.
 
<haskell>
 
bucketByResidual :: Int -> [Int] -> Array Int [Int]
 
bucketByResidual n xs = accumArray (\xs x -> x:xs) [] (0,n-1) [(x `mod` n, x) | x <- xs]
 
 
Data.Arra.IArray> bucketByResidual 4 [x*x | x <- [1..10]]
 
array (0,3) [(0,[100,64,36,16,4]),(1,[81,49,25,9,1]),(2,[]),(3,[])]
 
 
Data.Arra.IArray> amap reverse it
 
array (0,3) [(0,[4,16,36,64,100]),(1,[1,9,25,49,81]),(2,[]),(3,[])]
 
</haskell>
 
Note that the array can fill itself up in a circular fashion. Useful for dynamic programming. Here is the edit distance between two strings without array updates.
 
<haskell>
 
editDistance :: Eq a => [a] -> [a] -> Int
 
editDistance xs ys = table ! (m,n)
 
where
 
(m,n) = (length xs, length ys)
 
x = array (1,m) (zip [1..] xs)
 
y = array (1,n) (zip [1..] ys)
 
 
table :: Array (Int,Int) Int
 
table = array bnds [(ij, dist ij) | ij <- range bnds]
 
bnds = ((0,0),(m,n))
 
 
dist (0,j) = j
 
dist (i,0) = i
 
dist (i,j) = minimum [table ! (i-1,j) + 1, table ! (i,j-1) + 1,
 
if x ! i == y ! j then table ! (i-1,j-1) else table ! (i-1,j-1)]
 
</haskell>
 
 
 
[http://haskell.org/ghc/docs/latest/html/libraries/base/Data-Array-MArray.html Mutable arrays] like <hask>Data.Array.IO.IOArray i e</hask> are updated in place, but they have to live in the IO-monad or the ST-monad in order to not destroy referential transparency. There are also [http://haskell.org/ghc/docs/latest/html/libraries/base/Data-Array-Diff.html diff arrays] like <hask>Data.Array.Diff.DiffArray i e</hask> that look like immutable arrays but do updates in place if used in a single threaded way. Here is depth first search with diff arrays that checks whether a directed graph contains a cycle. ''Note: this example really belongs to Map or Set.''
 
<haskell>
 
import Control.Monad.State
 
type Node = Int
 
data Color = White | Grey | Black
 
 
hasCycle :: Array Node [Node] -> Bool
 
hasCycle graph = runState (mapDfs $ indices g) initSeen
 
where
 
initSeen :: DiffArray Node Color
 
initSeen = listArray (bounds graph) (repeat White)
 
mapDfs = fmap or . mapM dfs
 
dfs node = get >>= \seen -> case (seen ! node) of
 
Black -> return False
 
Grey -> return True -- we found a cycle
 
White -> do
 
modify $ \seen -> seen // [(node,Grey )]
 
found <- mapDfs (graph ! node)
 
modify $ \seen -> seen // [(node,Black)]
 
return found
 
</haskell>
 
 
== Network Programming ==
 
 
 
== XML ==
 
=== Parsing XML ===
 
 
 
== Databases ==
 
=== MySQL ===
 
=== PostgreSQL ===
 
=== SQLite ===
 
 
 
== FFI ==
 
=== How to interface with C===
 
 
 
== Testing ==
 
=== QuickCheck ===
 
=== HUnit ===
 

Latest revision as of 18:49, 26 May 2011