Haskell features
This article describes the features in the programming language Haskell. ExamplesFactorialA simple example that is often used to demonstrate the syntax of functional languages is the factorial function for non-negative integers, shown in Haskell: factorial :: Integer -> Integer
factorial 0 = 1
factorial n = n * factorial (n-1)
Or in one line: factorial n = if n > 1 then n * factorial (n-1) else 1
This describes the factorial as a recursive function, with one terminating base case. It is similar to the descriptions of factorials found in mathematics textbooks. Much of Haskell code is similar to standard mathematical notation in facility and syntax. The first line of the factorial function describes the type of this function; while it is optional, it is considered to be good style[1] to include it. It can be read as the function factorial ( The second line relies on pattern matching, an important feature of Haskell. Note that parameters of a function are not in parentheses but separated by spaces. When the function's argument is 0 (zero) it will return the integer 1 (one). For all other cases the third line is tried. This is the recursion, and executes the function again until the base case is reached. Using the factorial n = product [1..n]
Here factorial n = product (enumFromTo 1 n)
which, using the function composition operator (expressed as a dot in Haskell) to compose the product function with the curried enumeration function can be rewritten in point-free style:[2] factorial = product . enumFromTo 1
In the Hugs interpreter, one often needs to define the function and use it on the same line separated by a let { factorial n | n > 0 = n * factorial (n-1); factorial _ = 1 } in factorial 5
or factorial 5 where factorial = product . enumFromTo 1
The GHCi interpreter doesn't have this restriction and function definitions can be entered on one line (with the More complex examplesCalculatorIn the Haskell source immediately below, A simple Reverse Polish notation calculator expressed with the higher-order function calc :: String -> [Float]
calc = foldl f [] . words
where
f (x:y:zs) "+" = (y + x):zs
f (x:y:zs) "-" = (y - x):zs
f (x:y:zs) "*" = (y * x):zs
f (x:y:zs) "/" = (y / x):zs
f (x:y:zs) "FLIP" = y:x:zs
f zs w = read w : zs
The empty list is the initial state, and f interprets one word at a time, either as a function name, taking two numbers from the head of the list and pushing the result back in, or parsing the word as a floating-point number and prepending it to the list. Fibonacci sequenceThe following definition produces the list of Fibonacci numbers in linear time: fibs = 0 : 1 : zipWith (+) fibs (tail fibs)
The infinite list is produced by corecursion — the latter values of the list are computed on demand starting from the initial two items 0 and 1. This kind of a definition relies on lazy evaluation, an important feature of Haskell programming. For an example of how the evaluation evolves, the following illustrates the values of fibs and tail fibs after the computation of six items and shows how zipWith (+) has produced four items and proceeds to produce the next item: fibs = 0 : 1 : 1 : 2 : 3 : 5 : ... + + + + + + tail fibs = 1 : 1 : 2 : 3 : 5 : ... = = = = = = zipWith ... = 1 : 2 : 3 : 5 : 8 : ... fibs = 0 : 1 : 1 : 2 : 3 : 5 : 8 : ... The same function, written using Glasgow Haskell Compiler's parallel list comprehension syntax (GHC extensions must be enabled using a special command-line flag, here -XParallelListComp, or by starting the source file with fibs = 0 : 1 : [ a+b | a <- fibs | b <- tail fibs ]
or with regular list comprehensions: fibs = 0 : 1 : [ a+b | (a,b) <- zip fibs (tail fibs) ]
or directly self-referencing: fibs = 0 : 1 : next fibs where next (a : t@(b:_)) = (a+b) : next t
With stateful generating function: fibs = next (0,1) where next (a,b) = a : next (b, a+b)
or with fibs = unfoldr (\(a,b) -> Just (a, (b, a+b))) (0, 1)
or fibs = 0 : scanl (+) 1 fibs
Using data recursion with Haskell's predefined fixpoint combinator: fibs = fix (\xs -> 0 : 1 : zipWith (+) xs (tail xs)) -- zipWith version
= fix ((0:) . (1:) . (zipWith (+) <*> tail)) -- same as above, pointfree
= fix ((0:) . scanl (+) 1) -- scanl version
FactorialThe factorial we saw previously can be written as a sequence of functions: factorial n = foldr ((.) . (*)) id [1..n] $ 1
-- factorial 5 == ((1*) .) ( ((2*) .) ( ((3*) .) ( ((4*) .) ( ((5*) .) id )))) 1
-- == (1*) . (2*) . (3*) . (4*) . (5*) . id $ 1
-- == 1* ( 2* ( 3* ( 4* ( 5* ( id 1 )))))
factorial n = foldr ((.) . (*)) (const 1) [1..n] $ ()
-- factorial 5 == ((1*) .) ( ((2*) .) ( ((3*) .) ( ((4*) .) ( ((5*) .) (const 1) )))) ()
-- == (1*) . (2*) . (3*) . (4*) . (5*) . const 1 $ ()
-- == 1* ( 2* ( 3* ( 4* ( 5* ( const 1 () )))))
factorial n = foldr (($) . (*)) 1 [1..n] = foldr ($) 1 $ map (*) [1..n]
-- factorial 5 == ((1*) $) ( ((2*) $) ( ((3*) $) ( ((4*) $) ( ((5*) $) 1 ))))
-- == (1*) $ (2*) $ (3*) $ (4*) $ (5*) $ 1
-- == 1* ( 2* ( 3* ( 4* ( 5* 1 ))))
More examplesHamming numbersA remarkably concise function that returns the list of Hamming numbers in order: hamming = 1 : map (2*) hamming `union` map (3*) hamming
`union` map (5*) hamming
Like the various
Here the function
It is possible to generate only the unique multiples, for more efficient operation. Since there are no duplicates, there's no need to remove them: smooth235 = 1 : foldr (\p s -> fix $ mergeBy (<) s . map (p*) . (1:)) [] [2,3,5]
where
fix f = x where x = f x -- fixpoint combinator, with sharing
This uses the more efficient function mergeBy less xs ys = merge xs ys where
merge xs [] = xs
merge [] ys = ys
merge (x:xs) (y:ys) | less y x = y : merge (x:xs) ys
| otherwise = x : merge xs (y:ys)
Each vertical bar ( MergesortHere is a bottom-up merge sort, defined using the higher-order function mergesortBy less [] = []
mergesortBy less xs = head $
until (null . tail) (pairwise $ mergeBy less) [[x] | x <- xs]
pairwise f (a:b:t) = f a b : pairwise f t
pairwise f t = t
Prime numbersThe mathematical definition of primes can be translated pretty much word for word into Haskell: -- "Integers above 1 that cannot be divided by a smaller integer above 1"
-- primes = { n ∈ [2..] | ~ ∃ d ∈ [2..n-1] ⇒ rem n d = 0 }
-- = { n ∈ [2..] | ∀ d ∈ [2..n-1] ⇒ rem n d ≠ 0 }
primes = [ n | n <- [2..], all (\d -> rem n d /= 0) [2..(n-1)] ]
This finds primes by trial division. Note that it is not optimized for efficiency and has very poor performance. Slightly faster (but still very slow)[3] is this code by David Turner: primes = sieve [2..] where
sieve (p:xs) = p : sieve [x | x <- xs, rem x p /= 0]
Much faster is the optimal trial division algorithm primes = 2 : [ n | n <- [3..], all ((> 0) . rem n) $
takeWhile ((<= n) . (^2)) primes]
or an unbounded sieve of Eratosthenes with postponed sieving in stages,[4] primes = 2 : sieve primes [3..] where
sieve (p:ps) (span (< p*p) -> (h, t)) =
h ++ sieve ps (minus t [p*p, p*p+p..])
or the combined sieve implementation by Richard Bird,[5] -- "Integers above 1 without any composite numbers which
-- are found by enumeration of each prime's multiples"
primes = 2 : minus [3..]
(foldr (\(m:ms) r -> m : union ms r) []
[[p*p, p*p+p ..] | p <- primes])
or an even faster tree-like folding variant[6] with nearly optimal (for a list-based code) time complexity and very low space complexity achieved through telescoping multistage recursive production of primes: primes = 2 : _Y ((3 :) . minus [5,7..] . _U
. map (\p -> [p*p, p*p+2*p..]))
where
-- non-sharing Y combinator:
_Y g = g (_Y g) -- (g (g (g (g (...)))))
-- big union ~= nub.sort.concat
_U ((x:xs):t) = x : (union xs . _U . pairwise union) t
Working on arrays by segments between consecutive squares of primes, it's import Data.Array
import Data.List (tails, inits)
primes = 2 : [ n |
(r:q:_, px) <- zip (tails (2 : [p*p | p <- primes]))
(inits primes),
(n, True) <- assocs ( accumArray (\_ _ -> False) True
(r+1,q-1)
[ (m,()) | p <- px
, s <- [ div (r+p) p * p]
, m <- [s,s+p..q-1] ] ) ]
The shortest possible code is probably SyntaxLayoutHaskell allows indentation to be used to indicate the beginning of a new declaration. For example, in a where clause: product xs = prod xs 1
where
prod [] a = a
prod (x:xs) a = prod xs (a*x)
The two equations for the nested function The use of indentation to indicate program structure originates in Peter J. Landin's ISWIM language, where it was called the off-side rule. This was later adopted by Miranda, and Haskell adopted a similar (but rather more complex) version of Miranda's off-side rule, which is called "layout". Other languages to adopt whitespace character-sensitive syntax include Python and F#. The use of layout in Haskell is optional. For example, the function product xs = prod xs 1
where { prod [] a = a; prod (x:xs) a = prod xs (a*x) }
The explicit open brace after the Haskell's layout rule has been criticised for its complexity. In particular, the definition states that if the parser encounters a parse error during processing of a layout section, then it should try inserting a close brace (the "parse error" rule). Implementing this rule in a traditional parsing and lexical analysis combination requires two-way cooperation between the parser and lexical analyser, whereas in most languages, these two phases can be considered independently. Function callsApplying a function Haskell distinguishes function calls from infix operators syntactically, but not semantically. Function names which are composed of punctuation characters can be used as operators, as can other function names if surrounded with backticks; and operators can be used in prefix notation if surrounded with parentheses. This example shows the ways that functions can be called: add a b = a + b
ten1 = 5 + 5
ten2 = (+) 5 5
ten3 = add 5 5
ten4 = 5 `add` 5
Functions which are defined as taking several parameters can always be partially applied. Binary operators can be partially applied using section notation: ten5 = (+ 5) 5
ten6 = (5 +) 5
addfive = (5 +)
ten7 = addfive 5
List comprehensionsSee List comprehension#Overview for the Haskell example. Pattern matchingPattern matching is used to match on the different constructors of algebraic data types. Here are some functions, each using pattern matching on each of the types below: -- This type signature says that empty takes a list containing any type, and returns a Bool
empty :: [a] -> Bool
empty (x:xs) = False
empty [] = True
-- Will return a value from a Maybe a, given a default value in case a Nothing is encountered
fromMaybe :: a -> Maybe a -> a
fromMaybe x (Just y) = y
fromMaybe x Nothing = x
isRight :: Either a b -> Bool
isRight (Right _) = True
isRight (Left _) = False
getName :: Person -> String
getName (Person name _ _) = name
getSex :: Person -> Sex
getSex (Person _ sex _) = sex
getAge :: Person -> Int
getAge (Person _ _ age) = age
Using the above functions, along with the map empty [[1,2,3],[],[2],[1..]]
-- returns [False,True,False,False]
map (fromMaybe 0) [Just 2,Nothing,Just 109238, Nothing]
-- returns [2,0,109238,0]
map isRight [Left "hello", Right 6, Right 23, Left "world"]
-- returns [False, True, True, False]
map getName [Person "Sarah" Female 20, Person "Alex" Male 20, tom]
-- returns ["Sarah", "Alex", "Tom"], using the definition for tom above
TuplesTuples in haskell can be used to hold a fixed number of elements. They are used to group pieces of data of differing types: account :: (String, Integer, Double) -- The type of a three-tuple, representing
-- a name, balance, and interest rate
account = ("John Smith",102894,5.25)
Tuples are commonly used in the zip* functions to place adjacent elements in separate lists together in tuples (zip4 to zip7 are provided in the Data.List module): -- The definition of the zip function. Other zip* functions are defined similarly
zip :: [x] -> [y] -> [(x,y)]
zip (x:xs) (y:ys) = (x,y) : zip xs ys
zip _ _ = []
zip [1..5] "hello"
-- returns [(1,'h'),(2,'e'),(3,'l'),(4,'l'),(5,'o')]
-- and has type [(Integer, Char)]
zip3 [1..5] "hello" [False, True, False, False, True]
-- returns [(1,'h',False),(2,'e',True),(3,'l',False),(4,'l',False),(5,'o',True)]
-- and has type [(Integer,Char,Bool)]
In the GHC compiler, tuples are defined with sizes from 2 elements up to 62 elements. NamespacesIn the § More complex examples section above,
Typeclasses and polymorphismAlgebraic data types
Algebraic data types are used extensively in Haskell. Some examples of these are the built in list, -- A list of a's ([a]) is either an a consed (:) onto another list of a's, or an empty list ([])
data [a] = a : [a] | []
-- Something of type Maybe a is either Just something, or Nothing
data Maybe a = Just a | Nothing
-- Something of type Either atype btype is either a Left atype, or a Right btype
data Either a b = Left a | Right b
Users of the language can also define their own abstract data types. An example of an ADT used to represent a person's name, sex and age might look like: data Sex = Male | Female
data Person = Person String Sex Int -- Notice that Person is both a constructor and a type
-- An example of creating something of type Person
tom :: Person
tom = Person "Tom" Male 27
Type system
Monads and input/output
ST monadThe ST monad allows writing imperative programming algorithms in Haskell, using mutable variables (STRefs) and mutable arrays (STArrays and STUArrays). The advantage of the ST monad is that it allows writing code that has internal side effects, such as destructively updating mutable variables and arrays, while containing these effects inside the monad. The result of this is that functions written using the ST monad appear pure to the rest of the program. This allows using imperative code where it may be impractical to write functional code, while still keeping all the safety that pure code provides. Here is an example program (taken from the Haskell wiki page on the ST monad) that takes a list of numbers, and sums them, using a mutable variable: import Control.Monad.ST
import Data.STRef
import Control.Monad
sumST :: Num a => [a] -> a
sumST xs = runST $ do -- runST takes stateful ST code and makes it pure.
summed <- newSTRef 0 -- Create an STRef (a mutable variable)
forM_ xs $ \x -> do -- For each element of the argument list xs ..
modifySTRef summed (+x) -- add it to what we have in n.
readSTRef summed -- read the value of n, which will be returned by the runST above.
STM monadThe STM monad is an implementation of Software Transactional Memory in Haskell. It is implemented in the GHC compiler, and allows for mutable variables to be modified in transactions. Arrows
As Haskell is a pure functional language, functions cannot have side effects. Being non-strict, it also does not have a well-defined evaluation order. This is a challenge for real programs, which among other things need to interact with an environment. Haskell solves this with monadic types that leverage the type system to ensure the proper sequencing of imperative constructs. The typical example is input/output (I/O), but monads are useful for many other purposes, including mutable state, concurrency and transactional memory, exception handling, and error propagation. Haskell provides a special syntax for monadic expressions, so that side-effecting programs can be written in a style similar to current imperative programming languages; no knowledge of the mathematics behind monadic I/O is required for this. The following program reads a name from the command line and outputs a greeting message: main = do putStrLn "What's your name?"
name <- getLine
putStr ("Hello, " ++ name ++ "!\n")
The do-notation eases working with monads. This do-expression is equivalent to, but (arguably) easier to write and understand than, the de-sugared version employing the monadic operators directly: main = putStrLn "What's your name?" >> getLine >>= \ name -> putStr ("Hello, " ++ name ++ "!\n")
ConcurrencyThe Haskell language definition includes neither concurrency nor parallelism, although GHC supports both. Concurrent Haskell is an extension to Haskell that supports threads and synchronization.[7] GHC's implementation of Concurrent Haskell is based on multiplexing lightweight Haskell threads onto a few heavyweight operating system (OS) threads,[8] so that Concurrent Haskell programs run in parallel via symmetric multiprocessing. The runtime can support millions of simultaneous threads.[9] The GHC implementation employs a dynamic pool of OS threads, allowing a Haskell thread to make a blocking system call without blocking other running Haskell threads.[10] Hence the lightweight Haskell threads have the characteristics of heavyweight OS threads, and a programmer can be unaware of the implementation details. Recently,[when?] Concurrent Haskell has been extended with support for software transactional memory (STM), which is a concurrency abstraction in which compound operations on shared data are performed atomically, as transactions.[11] GHC's STM implementation is the only STM implementation to date to provide a static compile-time guarantee preventing non-transactional operations from being performed within a transaction. The Haskell STM library also provides two operations not found in other STMs: References
|
Portal di Ensiklopedia Dunia