From 8d3df49ae1aa2eb58af530bba0c71817411fd49d Mon Sep 17 00:00:00 2001 From: jpmoresmau Date: Wed, 21 Jan 2015 21:31:24 +0100 Subject: support GHC 7.10: no Safe-Inferred, Foldable instance --- html-test/ref/Properties.html | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) (limited to 'html-test/ref/Properties.html') diff --git a/html-test/ref/Properties.html b/html-test/ref/Properties.html index d491b98e..0e1d52ac 100644 --- a/html-test/ref/Properties.html +++ b/html-test/ref/Properties.html @@ -35,7 +35,7 @@ window.onload = function () {pageLoad();setSynopsis("mini_Properties.html");}; >Safe HaskellSafe-InferredSafe

Date: Sun, 2 Aug 2015 23:58:25 +0100 Subject: Update tests to follow HTML changes --- CHANGES | 4 + html-test/ref/A.html | 16 +- html-test/ref/AdvanceTypes.html | 8 +- html-test/ref/B.html | 10 +- html-test/ref/Bold.html | 4 +- html-test/ref/Bug1.html | 6 +- html-test/ref/Bug195.html | 136 +++--- html-test/ref/Bug2.html | 4 +- html-test/ref/Bug201.html | 6 +- html-test/ref/Bug253.html | 4 +- html-test/ref/Bug26.html | 10 +- html-test/ref/Bug294.html | 18 +- html-test/ref/Bug298.html | 12 +- html-test/ref/Bug3.html | 4 +- html-test/ref/Bug308.html | 6 +- html-test/ref/Bug308CrossModule.html | 4 +- html-test/ref/Bug310.html | 4 +- html-test/ref/Bug313.html | 6 +- html-test/ref/Bug335.html | 6 +- html-test/ref/Bug387.html | 6 +- html-test/ref/Bug4.html | 4 +- html-test/ref/Bug6.html | 88 ++-- html-test/ref/Bug7.html | 8 +- html-test/ref/Bug8.html | 18 +- html-test/ref/Bug85.html | 14 +- html-test/ref/BugDeprecated.html | 14 +- html-test/ref/BugExportHeadings.html | 14 +- html-test/ref/Bugs.html | 6 +- html-test/ref/DeprecatedClass.html | 10 +- html-test/ref/DeprecatedData.html | 14 +- html-test/ref/DeprecatedFunction.html | 6 +- html-test/ref/DeprecatedFunction2.html | 4 +- html-test/ref/DeprecatedFunction3.html | 4 +- html-test/ref/DeprecatedModule.html | 4 +- html-test/ref/DeprecatedModule2.html | 4 +- html-test/ref/DeprecatedNewtype.html | 10 +- html-test/ref/DeprecatedReExport.html | 4 +- html-test/ref/DeprecatedRecord.html | 60 +-- html-test/ref/DeprecatedTypeFamily.html | 6 +- html-test/ref/DeprecatedTypeSynonym.html | 6 +- html-test/ref/Examples.html | 4 +- html-test/ref/Extensions.html | 4 +- html-test/ref/FunArgs.html | 12 +- html-test/ref/GADTRecords.html | 64 +-- html-test/ref/Hash.html | 14 +- html-test/ref/HiddenInstances.html | 6 +- html-test/ref/HiddenInstancesB.html | 6 +- html-test/ref/Hyperlinks.html | 4 +- html-test/ref/IgnoreExports.html | 6 +- html-test/ref/ImplicitParams.html | 12 +- html-test/ref/Minimal.html | 52 +-- html-test/ref/ModuleWithWarning.html | 4 +- html-test/ref/NamedDoc.html | 2 +- html-test/ref/Nesting.html | 18 +- html-test/ref/NoLayout.html | 4 +- html-test/ref/NonGreedy.html | 4 +- html-test/ref/Operators.html | 44 +- html-test/ref/PatternSyns.html | 22 +- html-test/ref/Properties.html | 4 +- html-test/ref/PruneWithWarning.html | 2 +- html-test/ref/QuasiExpr.html | 28 +- html-test/ref/QuasiQuote.html | 4 +- html-test/ref/SpuriousSuperclassConstraints.html | 4 +- html-test/ref/TH.html | 4 +- html-test/ref/TH2.html | 4 +- html-test/ref/Test.html | 522 ++++++++++++----------- html-test/ref/Threaded.html | 16 +- html-test/ref/Ticket112.html | 4 +- html-test/ref/Ticket61.html | 6 +- html-test/ref/Ticket75.html | 8 +- html-test/ref/TitledPicture.html | 6 +- html-test/ref/TypeFamilies.html | 76 ++-- html-test/ref/TypeFamilies2.html | 12 +- html-test/ref/TypeOperators.html | 44 +- html-test/ref/Unicode.html | 4 +- html-test/ref/Visible.html | 4 +- html-test/ref/haddock-util.js | 2 +- html-test/ref/mini_FunArgs.html | 18 + html-test/ref/ocean.css | 32 +- 79 files changed, 853 insertions(+), 805 deletions(-) (limited to 'html-test/ref/Properties.html') diff --git a/CHANGES b/CHANGES index d35528d1..2cb0a5e0 100644 --- a/CHANGES +++ b/CHANGES @@ -6,6 +6,10 @@ Changes in version 2.16.2 * Break up response file arguments on newlines + * Various HTML fixes (#301, #406, #407, #421) + + * Line anchors in hyperlinked source (#420) + Changes in version 2.16.1 * Don't default to type constructors for out-of-scope names (#253 and diff --git a/html-test/ref/A.html b/html-test/ref/A.html index 96e2d001..56c04bc6 100644 --- a/html-test/ref/A.html +++ b/html-test/ref/A.html @@ -88,7 +88,7 @@ window.onload = function () {pageLoad();setSynopsis("mini_A.html");}; >

data A

A

test2 :: Bool

data X

X

reExport :: Int

Produced by Haddock version 2.15.0

version 2.16.2

data Pattern :: [*] -> * where
Nil :: Pattern
Cons :: Maybe

Produced by Haddock version 2.15.0

version 2.16.2

reExport :: Int

data X

X

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: t

Produced by Haddock version 2.15.0

version 2.16.2

data T

T

Produced by Haddock version 2.15.0

version 2.16.2

data T

Produced by Haddock version 2.16.0

version 2.16.2

Documentation

x :: A

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

f :: ()

g :: ()

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: ()

Produced by Haddock version 2.16.0

version 2.16.2

Documentation

f :: ()

g :: ()

class C a where

Methods

c_f :: a

Produced by Haddock version 2.16.1

version 2.16.2

data A

gadtField :: GADT A

data family DP t :: *

DP A = = ProblemCtor' A

Produced by Haddock version 2.16.1

version 2.16.2

Documentation

(<^>) :: (a -> a) -> a -> a

(<^) :: a -> a -> a

(^>) :: a -> a -> a

(⋆^) :: a -> a -> a

f :: ()

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: Int

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

f :: ()

g :: ()

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

h :: ()

Produced by Haddock version 2.15.0

version 2.16.2

type family a a + b :: Nat

Produced by Haddock version 2.16.0

version 2.16.2

Documentation

a :: a

b :: a

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

f :: ()

g :: ()

Produced by Haddock version 2.16.1

version 2.16.2

test1 :: Int

test2 :: Int

Produced by Haddock version 2.16.1

version 2.16.2

Documentation

foo :: Int

Produced by Haddock version 2.15.0

version 2.16.2

data A

A

Fields

someField :: ()

Doc for someField of A

someOtherField :: ()

Doc for someOtherField of A

B

Fields

someField :: ()

Doc for someField of A

someOtherField :: ()

Doc for someOtherField of A

C

Fields

someField :: ()

Doc for someField of A

someOtherField :: ()

Doc for someOtherField of A

A Int

data B

data C

B

Fields

b :: Int
 

data D

C

Fields

c1 :: Int
 
c2 :: Int
 
D Int

newtype E

E Int

Produced by Haddock version 2.15.0

version 2.16.2

data Foo

Foo

class Bar x y

Produced by Haddock version 2.16.1

version 2.16.2

data Typ

Type (Typ
TFree (Typ

(-->) :: t -> t1 -> Typ

s :: t

t :: t

main :: t

Produced by Haddock version 2.16.0

version 2.16.2

data Foo :: (* -> *) -> * -> * where
Bar :: f x -> Foo

data Baz :: * where
Baz' :: Baz

data Qux where
Quux :: Qux

Produced by Haddock version 2.16.0

version 2.16.2

Documentation

foo :: Int

bar :: Int

baz :: Int

one :: Int

two :: Int

three :: Int

Produced by Haddock version 2.15.0

version 2.16.2

Foo

foo :: IntBar

bar :: IntBaz

baz :: IntOne

one :: IntTwo

two :: IntThree

three :: Int

Produced by Haddock version 2.15.0

version 2.16.2

data A a

A a (a -> Int

Produced by Haddock version 2.15.0

version 2.16.2

class SomeClass a where

Methods

foo :: a -> a

class SomeOtherClass a where

Methods

bar :: a -> a

Produced by Haddock version 2.15.0

version 2.16.2

data Foo

Foo
Bar

data One

One
Two

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: Int

bar :: Int

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: Int

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: Integer

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: Int

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foo :: Int

Produced by Haddock version 2.15.0

version 2.16.2

newtype SomeNewType

SomeNewTypeConst String

newtype SomeOtherNewType

SomeOtherNewTypeConst String

Produced by Haddock version 2.15.0

version 2.16.2

Re-exported from an other module

foo :: Int

Produced by Haddock version 2.15.0

version 2.16.2

data Foo

Produced by Haddock version 2.15.0

version 2.16.2

data family SomeTypeFamily k :: * -> *

data family SomeOtherTypeFamily k :: * -> *

Produced by Haddock version 2.16.0

version 2.16.2

type TypeSyn = String

type OtherTypeSyn = String

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

fib :: Integer

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

foobar :: t

Produced by Haddock version 2.15.0

version 2.16.2

Documentation

f

g

h

i

j

Produced by Haddock version 2.15.0

version 2.16.2

data H1 a b where

Foo

Fields

fooName :: String

some name

fooValue :: Int
  • fooValue :: Int

    Deprecated: do not use this

    some value

  • Produced by Haddock version 2.15.0

    version 2.16.2

    data HashTable key val

    s

    new :: (Eq

    lookup :: Hash

    class Hash a where

    Methods

    hash :: a -> Int

    Produced by Haddock version 2.16.1

    version 2.16.2

    class VisibleClass a

    data VisibleData

    Produced by Haddock version 2.16.1

    version 2.16.2

    class Foo a

    data Bar

    Produced by Haddock version 2.16.1

    version 2.16.2

    Documentation

    foo :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    foo :: Int

    bar :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    data X

    C1 :: H1
    C2 :: Ord
    C3 :: Int

    Fields

    field :: Int

    hello docs

    C4 :: a -> H1

    Fields

    field2 :: a

    hello2 docs

    X

    c :: (?x :: X

    d :: (?x :: X

    f :: ((?x :: X

    Produced by Haddock version 2.15.0

    version 2.16.2

    class Foo a where

    Methods

    foo :: a

    Any two of these are required...

    bar :: a

    bat :: a

    fooBarBat :: (a, a, a)

    class Weird a where

    Methods

    a :: a

    b :: a

    c :: a

    d :: a

    e :: a

    f :: a

    g :: a

    class NoMins a where

    Methods

    x :: a

    y :: a

    z :: a

    class FullMin a where

    Methods

    aaa :: a

    bbb :: a

    class PartialMin a where

    Methods

    ccc :: a

    class EmptyMin a where

    Methods

    eee :: a

    fff :: a

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    foo :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    d :: t

    e :: t

    f :: t

    g :: t

    h :: t

    i :: t

    j :: t

    k :: t

    Produced by Haddock version 2.16.1

    version 2.16.2

    Documentation

    g :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    f :: a

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    (+-) :: a -> a -> a

    (*/) :: a -> a -> a infixr 7

    foo :: a -> a -> a infixl 3

    data Foo

    Foo `Bar` FooFoo :- Foo

    pattern (:+) :: t -> t -> [t] infixr 3

    data a a <-> b where
    (:<->) :: a -> b -> a <->

    type family a a ++ b infix 3

    data family a a ** b infix 9

    class a a ><> b where

    type a a <>< b :: * infixl 2

    data a a ><< b infixl 3

    Methods

    (>><), , (<<>) :: a -> b -> () infixl 5 <<>

    (**>), , (**<), , (>**), , (<**) :: a -> a -> () infixr 8 **>, >**

    type (>-<) a b = a <->

    Produced by Haddock version 2.16.0

    version 2.16.2

    data FooType x

    FooCtor x

    pattern Foo :: t -> FooType

    pattern Bar :: t -> FooType

    pattern (:<->) :: t -> t -> (FooType

    data a a >< b

    Doc for (><><)

    Empty

    pattern E :: (><)

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    fib :: Integer

    Produced by Haddock version 2.15.0

    version 2.16.2

    Produced by Haddock version 2.15.0

    version 2.16.2

    data Expr

    IntExpr Integer
    AntiIntExpr String
    BinopExpr BinOp
    AntiExpr String

    data BinOp

    AddOp
    SubOp
    MulOp
    DivOp

    expr :: QuasiQuoter

    parseExprExp :: String

    Produced by Haddock version 2.16.1

    version 2.16.2

    Documentation

    val :: Integer

    Produced by Haddock version 2.15.0

    version 2.16.2

    data SomeType f a

    Produced by Haddock version 2.16.1

    version 2.16.2

    Documentation

    decl :: Q [Dec]

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    f :: t -> t

    Produced by Haddock version 2.15.0

    version 2.16.2

    data T a b

    A Int
    B (T

    data T2 a b

    data T3 a b

    A1 a
    B1 b

    data T4 a b

    A2 a
    B2 b

    data T5 a b

    A3 a
    B3 b

    data T6

    A4
    B4
    C4

    newtype N1 a

    N1 a

    newtype N2 a b

    newtype N3 a b

    N2

    Fields

    n :: a b
     
    • n :: a b
       

    data N4 a b

    newtype N5 a b

    N3

    Fields

    n3 :: a b

    this is the n3 field

    • n3 :: a b

      this is the n3 field

    newtype N6 a b

    N5

    Fields

    n5 :: a b

    no docs on the datatype or the constructor

    • n5 :: a b

      no docs on the datatype or the constructor

    newtype N7 a b

    N6

    Fields

    n6 :: a b
     
    • n6 :: a b
       

    data R

    N7

    Fields

    n7 :: a b
     
    • n7 :: a b
       

    data R1

    C1

    Fields

    p :: Int

    This comment applies to the p field

    q :: forall a. a -> a

    This comment applies to the q field

    r, s :: Int

    This comment applies to both r and s

    • p :: Int

      This comment applies to the p field

    • q :: forall a. a -> a

      This comment applies to the q field

    • r, s :: Int

      This comment applies to both r and s

    C2

    Fields

    t :: T1 -> T2 Int Int -> T3 Bool Bool -> T4 Float Float -> T5 () ()
     
    u, v :: Int
     
    classD a => a => C a where

    Methods

    a :: IO method

    b :: [a]

    class D a where

    Methods

    d :: T a b

    e :: (a, a)

    class E a

    class F a where

    Methods

    ff :: a

    Function types

    f :: C

    g :: IntA hidden module

    hidden :: Int

    data Ex a

    forall b . C b => b => Ex1 b
    C3

    Fields

    s1 :: Int

    The s1 record selector

    s2 :: Int

    The s2 record selector

    s3 :: Int

    The s3 record selector

    forall b . b . Ex2 bforall b . C a => a => Ex3 b
    Ex4 (forallType signatures with argument docs

    k

    l

    m

    o

    f' :: Int

    withoutType :: t

    Produced by Haddock version 2.16.1

    version 2.16.2

    Synopsis

    Documentation

    f :: :: Integer

    Documentation

    f :: a

    Produced by Haddock version 2.15.0

    version 2.16.2

    class C a where

    Methods

    f :: a

    Produced by Haddock version 2.15.0

    version 2.16.2

    data a a :- b

    Q

    f :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    bar :: Integer

    Produced by Haddock version 2.15.0

    version 2.16.2

    data X

    X
    X
    XX
    XXXAssocD * X = = AssocX

    type family Foo a

    data family Bar a

    Bar W = = BarX Z

    Produced by Haddock version 2.16.1

    version 2.16.2

    data a a :-: b

    data (a (a :+: b) c

    data Op a b

    newtype O g f a

    ZA
    ZBwhere

    class a a <=> b

    biO :: (g `O`

    f :: (a ~ b) => a -> b

    g :: (a ~ b, b ~ c) => a -> c

    x :: (a :-:

    y :: (a <=>

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    x :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    Documentation

    visible :: Int

    Produced by Haddock version 2.15.0

    version 2.16.2

    g

    .doc { + display: table-cell; padding-left: 0.5em; margin-bottom: 0.5em; } -.subs dd.empty { - display: none; -} - -.subs dd p { +.subs ul li > .doc p { margin: 0; } -- cgit v1.2.3
    O

    Fields

    unO :: g (f a)
     
    • unO :: g (f a)