[Update tests following recent changes David Waern **20101206140918 Ignore-this: 5664255b5a3d14466139ef92cb8e753a ] { hunk ./tests/golden-tests/tests/A.html.ref 4 -

 

A

Documentation

data A

Constructors

A 
+

 

A

Documentation

data A

Constructors

A 
hunk ./tests/golden-tests/tests/B.html.ref 4 -

 

B

Documentation

module A

+

 

B

Documentation

module A

hunk ./tests/golden-tests/tests/Bug1.html.ref 6 -

Constructors

T 
+

Constructors

T 
hunk ./tests/golden-tests/tests/Bug2.html.ref 4 -

 

Bug2

Documentation

x :: A

+

 

Bug2

Documentation

x :: A

hunk ./tests/golden-tests/tests/Bug3.html.ref 6 -

+

hunk ./tests/golden-tests/tests/Bug4.html.ref 5 -

+

hunk ./tests/golden-tests/tests/Bug6.html.ref 12 -

Constructors

E Int 
+

Constructors

E Int 
hunk ./tests/golden-tests/tests/Bug7.html.ref 10 -

+

hunk ./tests/golden-tests/tests/Bug8.html.ref 4 -

 

Bug8

Documentation

data Typ

Constructors

Type (String, [Typ]) 
TFree (String, [String]) 
+

 

Bug8

Documentation

data Typ

Constructors

Type (String, [Typ]) 
TFree (String, [String]) 
hunk ./tests/golden-tests/tests/Bugs.html.ref 4 -

 

Bugs

Documentation

data A a

Constructors

A a (a -> Int) 
+

 

Bugs

Documentation

data A a

Constructors

A a (a -> Int) 
hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 6 -

map f [x1, x2, ..., xn] == [f x1, f x2, ..., f xn] +

 map f [x1, x2, ..., xn] == [f x1, f x2, ..., f xn]
hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 8
-

class Monad m where

The Monad class defines the basic operations over a monad, +

class Monad m where

The Monad class defines the basic operations over a monad, hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 16 -

return a >>= k == k a +

 return a >>= k  ==  k a
hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 19
-

Instances of both Monad and Functor should additionally satisfy the law: -

fmap f xs == xs >>= return . f -

The instances of Monad for lists, Data.Maybe.Maybe and System.IO.IO +

Instances of both Monad and Functor should additionally satisfy the law: +

 fmap f xs  ==  xs >>= return . f
+

The instances of Monad for lists, Data.Maybe.Maybe and System.IO.IO hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 32 -

Instances

Monad [] 
Monad IO 
Monad Q 
Monad Maybe 
Monad ((->) r) 

runInteractiveProcess

Arguments

:: FilePath

Filename of the executable +

Instances

Monad [] 
Monad IO 
Monad Q 
Monad Maybe 
Monad ((->) r) 
Monad (Either e) 

runInteractiveProcess

Arguments

:: FilePath

Filename of the executable hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 39 -

(inp,out,err,pid) <- runInteractiveProcess "..." +

   (inp,out,err,pid) <- runInteractiveProcess "..."
hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 41
-

The Handles are initially in binary mode; if you need them to be +

The Handles are initially in binary mode; if you need them to be hunk ./tests/golden-tests/tests/CrossPackageDocs.html.ref 43 -

+

hunk ./tests/golden-tests/tests/Examples.html.ref 22 - + hunk ./tests/golden-tests/tests/FunArgs.html.ref 13 -

+

hunk ./tests/golden-tests/tests/GADTRecords.html.ref 7 -

+

hunk ./tests/golden-tests/tests/Hash.html.ref 9 -

Synopsis

The HashTable type +

Synopsis

The HashTable type hunk ./tests/golden-tests/tests/Hash.html.ref 12 -

Operations on HashTables +

Operations on HashTables hunk ./tests/golden-tests/tests/Hash.html.ref 17 -

The Hash class +

The Hash class hunk ./tests/golden-tests/tests/Hash.html.ref 20 -

Instances

Hash Float 
Hash Int 
(Hash a, Hash b) => Hash (a, b) 
+

Instances

Hash Float 
Hash Int 
(Hash a, Hash b) => Hash (a, b) 
hunk ./tests/golden-tests/tests/NamedDoc.html.ref 5 -

+

hunk ./tests/golden-tests/tests/NoLayout.html.ref 5 -

+

hunk ./tests/golden-tests/tests/QuasiExpr.html.ref 4 -

QuasiExpr

Documentation

data BinOp

Constructors

AddOp 
SubOp 
MulOp 
DivOp 

parseExprExp :: String -> Q Exp

+

QuasiExpr

Documentation

data BinOp

Constructors

AddOp 
SubOp 
MulOp 
DivOp 

Instances

parseExprExp :: String -> Q Exp

hunk ./tests/golden-tests/tests/QuasiQuote.html.ref 4 -

QuasiQuote

Documentation

+

QuasiQuote

Documentation

hunk ./tests/golden-tests/tests/TH.html.ref 4 -

TH

Documentation

decl :: Q [Dec]

+

TH

Documentation

decl :: Q [Dec]

hunk ./tests/golden-tests/tests/TH2.html.ref 4 -

TH2

+

TH2

hunk ./tests/golden-tests/tests/Test.html.ref 18 -

Synopsis

Type declarations -

Data types +

Synopsis

Type declarations +

Data types hunk ./tests/golden-tests/tests/Test.html.ref 42 -

Fields

n7 :: a b
 

Records +

Fields

n7 :: a b
 

Records hunk ./tests/golden-tests/tests/Test.html.ref 57 -

Class declarations +

Class declarations hunk ./tests/golden-tests/tests/Test.html.ref 64 -

Function types +

Function types hunk ./tests/golden-tests/tests/Test.html.ref 82 -

Auxiliary stuff +

Auxiliary stuff hunk ./tests/golden-tests/tests/Test.html.ref 120 -

A hidden module -

hidden :: Int -> Int

A visible module +

A hidden module +

hidden :: Int -> Int

A visible module hunk ./tests/golden-tests/tests/Test.html.ref 123 -

Existential / Universal types +

Existential / Universal types hunk ./tests/golden-tests/tests/Test.html.ref 125 -

Constructors

forall b . C b => Ex1 b 
forall b . Ex2 b 
forall b . C a => Ex3 b 
Ex4 (forall a. a -> a) 

Type signatures with argument docs +

Constructors

forall b . C b => Ex1 b 
forall b . Ex2 b 
forall b . C a => Ex3 b 
Ex4 (forall a. a -> a) 

Type signatures with argument docs hunk ./tests/golden-tests/tests/Test.html.ref 142 -

A section -

A subsection +

A section +

A subsection hunk ./tests/golden-tests/tests/Test.html.ref 148 -

+

hunk ./tests/golden-tests/tests/Ticket112.html.ref 5 -

+

hunk ./tests/golden-tests/tests/Ticket61.html.ref 5 -

+

hunk ./tests/golden-tests/tests/Ticket75.html.ref 5 -

+

hunk ./tests/golden-tests/tests/TypeFamilies.html.ref 9 -

+

hunk ./tests/golden-tests/tests/TypeOperators.html.ref 5 -

Synopsis

stuff -

data a :-: b

data (a :+: b) c

data Op a b

newtype O g f a

Constructors

O 

Fields

unO :: g (f a)
 

biO :: (g `O` f) a

newtype Flip (~>) b a

Constructors

Flip 

Fields

unFlip :: a ~> b
 
+

Synopsis

stuff +

data a :-: b

data (a :+: b) c

data Op a b

newtype O g f a

Constructors

O 

Fields

unO :: g (f a)
 

biO :: (g `O` f) a

newtype Flip (~>) b a

Constructors

Flip 

Fields

unFlip :: a ~> b
 
hunk ./tests/golden-tests/tests/Visible.html.ref 4 -

Visible

Documentation

+

Visible

Documentation

}