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/Test.html | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) (limited to 'html-test/ref/Test.html') diff --git a/html-test/ref/Test.html b/html-test/ref/Test.html index 89491f01..6f2e9478 100644 --- a/html-test/ref/Test.html +++ b/html-test/ref/Test.html @@ -65,7 +65,7 @@ window.onload = function () {pageLoad();setSynopsis("mini_Test.html");}; >Safe HaskellSafe-InferredSafe

Date: Thu, 22 Jan 2015 19:32:10 +0000 Subject: Update test files Test: a correct behaviour for fields comma-separating values. I'm surprised we had no bug open for this. Maybe it affects how #301 renders now but I doubt. Operators: Seems GHC is giving us a new order for operators, something must have changed on their side again. cc @haasn , this makes the fixity to the side not match the order on the LHS which is a bit unpleasant. Maybe the fixity can be made to match the GHC order? Bug335: We expand examples by default now. Bug310: Now inferred safe. --- html-test/ref/Bug310.html | 4 ++-- html-test/ref/Bug335.html | 6 +++--- html-test/ref/Operators.html | 16 ++++++++-------- html-test/ref/Test.html | 40 +++++----------------------------------- 4 files changed, 18 insertions(+), 48 deletions(-) (limited to 'html-test/ref/Test.html') diff --git a/html-test/ref/Bug310.html b/html-test/ref/Bug310.html index 926d6cf2..c38af59c 100644 --- a/html-test/ref/Bug310.html +++ b/html-test/ref/Bug310.html @@ -35,7 +35,7 @@ window.onload = function () {pageLoad();setSynopsis("mini_Bug310.html");}; >Safe HaskellNoneSafe

Produced by Haddock version 2.15.1

version 2.16.0

ExF:

abc

ExG:

>>> 

Produced by Haddock version 2.15.1

version 2.16.0

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

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

Produced by Haddock version 2.15.0

version 2.16.0

  • r :: Int
  • , s :: Int
  • u :: Int
  • , v :: Int
    r :: Int

    This comment applies to both r and s

    , s :: Int
    u :: Int
     
    , v :: Int

    Produced by Haddock version 2.15.0

    version 2.16.0

  • Date: Sun, 14 Jun 2015 10:31:18 +0100 Subject: Update tests for the CSS changes --- CHANGES | 2 + html-test/ref/Bug26.html | 12 +- html-test/ref/Bug294.html | 70 +- html-test/ref/Bug7.html | 34 +- html-test/ref/Hash.html | 44 +- html-test/ref/HiddenInstances.html | 50 +- html-test/ref/HiddenInstancesB.html | 26 +- html-test/ref/QuasiExpr.html | 26 +- html-test/ref/SpuriousSuperclassConstraints.html | 34 +- html-test/ref/Test.html | 26 +- html-test/ref/TypeFamilies.html | 834 ++++++++++++----------- html-test/ref/TypeFamilies2.html | 114 ++-- html-test/ref/ocean.css | 23 + 13 files changed, 719 insertions(+), 576 deletions(-) (limited to 'html-test/ref/Test.html') diff --git a/CHANGES b/CHANGES index 368002dd..cb17fde7 100644 --- a/CHANGES +++ b/CHANGES @@ -19,6 +19,8 @@ Changes in version 2.16.1 * Fix cross-module instance locations (#383) + * Fix alignment of Source link for instances in Firefox (#384) + Changes in version 2.16.0 * Experimental collapsible header support (#335) diff --git a/html-test/ref/Bug26.html b/html-test/ref/Bug26.html index 981370fa..c670264c 100644 --- a/html-test/ref/Bug26.html +++ b/html-test/ref/Bug26.html @@ -145,10 +145,12 @@ window.onload = function () {pageLoad();setSynopsis("mini_Bug26.html");}; >
    C ()C ()

    instance for ()

    Produced by Haddock version 2.15.1

    version 2.16.1

    data DP A = ProblemCtor' Adata DP A = ProblemCtor' A 
    data TP A = ProblemCtor Adata TP A = ProblemCtor A 

    Produced by Haddock version 2.15.0

    version 2.16.1

    data DP A = ProblemCtor' Adata DP A = ProblemCtor' A 
    Bar Foo FooBar Foo Foo

    Bar Foo FooBar Foo Foo

    Produced by Haddock version 2.15.0

    version 2.16.1

    Produced by Haddock version 2.15.0

    version 2.16.1

    Hash FloatHash Float 
    Hash IntHash Int 
    (Hash a, Hash b) => Hash (a, b)(Hash a, Hash b) => Hash (a, b) 
    VisibleClass IntVisibleClass Int

    VisibleClass VisibleDataVisibleClass VisibleData

    Num VisibleDataNum VisibleData

    VisibleClass VisibleDataVisibleClass VisibleData

    Produced by Haddock version 2.15.0

    version 2.16.1

    Foo BarFoo Bar

    Foo BarFoo Bar

    Produced by Haddock version 2.15.0

    version 2.16.1

    Show ExprShow Expr 

    Produced by Haddock version 2.15.0

    version 2.16.1

    Show BinOpShow BinOp 

    Produced by Haddock version 2.15.0

    version 2.16.1

    Functor (SomeType f)Functor (SomeType f) 
    Applicative f => Applicative (SomeType f)Applicative f => Applicative (SomeType f) 

    Produced by Haddock version 2.16.0

    version 2.16.1

    D FloatD Float 
    D IntD Int 
    Assoc * XAssoc * X

    Test * XTest * X

    (><) X XX XXX(><) X XX XXX 
    type Foo X = Ytype Foo X = Y

    data AssocD * X = AssocXdata AssocD * X = AssocX 
    type AssocT * X = Foo * Xtype AssocT * X = Foo * X 
    data Bat * X data Bat * X }

    type Foo * X = Ytype Foo * X = Y

    type (<>) * X a = Xtype (<>) * X a = X 
    type (<>) X XXX XX = Xtype (<>) X XXX XX = X 
    Assoc * YAssoc * Y

    Test * YTest * Y

    data Bar Ydata Bar Y 
    data AssocD * Y = AssocYdata AssocD * Y = AssocY 
    type AssocT * Y = Bat * Ytype AssocT * Y = Bat * Y 
    data Bat * Y = BatY Ydata Bat * Y = BatY Y

    type Foo * Y = Xtype Foo * Y = X

    type (<>) * Y a = atype (<>) * Y a = a 
    data Bat Z wheredata Bat Z where } -> Bat Z ZB

    Test * YTest * Y

    Test * XTest * X

    type Foo * Y = Xtype Foo * Y = X

    type Foo * X = Ytype Foo * X = Y

    data Bat Z wheredata Bat Z where } -> Bat Z ZB

    data Bat * Y = BatY Ydata Bat * Y = BatY Y

    data Bat * X data Bat * X }

    Assoc * YAssoc * Y

    Assoc * XAssoc * X

    type (<>) * Y a = atype (<>) * Y a = a 
    type (<>) * X a = Xtype (<>) * X a = X 
    type (<>) X XXX XX = Xtype (<>) X XXX XX = X 

    Produced by Haddock version 2.15.0

    version 2.16.1

    (><) X XX XXX(><) X XX XXX 
    data Bar W = BarX Zdata Bar W = BarX Z

    Shown because BarX is still exported despite Z being hidden

    type Foo Wtype Foo W

    type Foo Wtype Foo W

    type Foo X = Ytype Foo X = Y

    Produced by Haddock version 2.15.0

    version 2.16.1

    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/Test.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

    data Bar W = BarX Zdata Bar W = BarX Z

    Shown because BarX is still exported despite Z being hidden

    data Bar Ydata Bar Y 
    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

    Date: Fri, 31 Jul 2015 20:16:33 +0200 Subject: Make identifier generation also architecture-independent. --- haddock-api/src/Haddock/Backends/Xhtml/Decl.hs | 12 ++++--- html-test/ref/Bug7.html | 8 ++--- html-test/ref/Hash.html | 8 ++--- html-test/ref/HiddenInstances.html | 16 +++++----- html-test/ref/HiddenInstancesB.html | 8 ++--- html-test/ref/QuasiExpr.html | 4 +-- html-test/ref/SpuriousSuperclassConstraints.html | 8 ++--- html-test/ref/Test.html | 4 +-- html-test/ref/TypeFamilies.html | 40 ++++++++++++------------ 9 files changed, 55 insertions(+), 53 deletions(-) (limited to 'html-test/ref/Test.html') diff --git a/haddock-api/src/Haddock/Backends/Xhtml/Decl.hs b/haddock-api/src/Haddock/Backends/Xhtml/Decl.hs index c30d0e62..f1203210 100644 --- a/haddock-api/src/Haddock/Backends/Xhtml/Decl.hs +++ b/haddock-api/src/Haddock/Backends/Xhtml/Decl.hs @@ -31,10 +31,12 @@ import Haddock.Syb import Haddock.Doc (combineDocumentation) import Data.Bits +import Data.Char import Data.Data (Data, cast) import Data.List ( intersperse, sort ) import qualified Data.Map as Map import Data.Maybe +import Data.Word import Text.XHtml hiding ( name, title, p, quote ) import GHC @@ -636,16 +638,16 @@ instanceId orgin no ihd = concat -- section anchors in testing framework and that is not only inconvenient but -- also makes testing less viable. And it is only temporary solution so we can -- live with it. -instHeadId :: InstHead DocName -> Int +instHeadId :: InstHead DocName -> Word64 instHeadId (InstHead { .. }) = - djb2 . map key $ [ihdClsName] ++ names ihdTypes ++ names ihdKinds + djb2 id . map key $ [ihdClsName] ++ names ihdTypes ++ names ihdKinds where names = everything (++) $ maybeToList . (cast :: forall a. Data a => a -> Maybe DocName) - key = djb2 . occNameString . nameOccName . getName + key = djb2 (fromIntegral . ord) . occNameString . nameOccName . getName - djb2 :: Enum a => [a] -> Int - djb2 = foldl (\h c -> h * 33 `xor` fromEnum c) 5381 + djb2 :: (a -> Word64) -> [a] -> Word64 + djb2 conv = foldl (\h c -> h * 33 `xor` conv c) 5381 ------------------------------------------------------------------------------- diff --git a/html-test/ref/Bug7.html b/html-test/ref/Bug7.html index f0fbc44d..4c0ba83b 100644 --- a/html-test/ref/Bug7.html +++ b/html-test/ref/Bug7.html @@ -106,7 +106,7 @@ window.onload = function () {pageLoad();setSynopsis("mini_Bug7.html");}; > Date: Mon, 3 Aug 2015 16:05:01 +0200 Subject: Accept tests affected by changes related to instance expander. --- html-test/ref/Bug26.html | 10 +- html-test/ref/Bug7.html | 36 +++--- html-test/ref/Hash.html | 46 +++---- html-test/ref/HiddenInstances.html | 56 ++++---- html-test/ref/HiddenInstancesB.html | 28 ++-- html-test/ref/QuasiExpr.html | 28 ++-- html-test/ref/SpuriousSuperclassConstraints.html | 32 ++--- html-test/ref/Test.html | 28 ++-- html-test/ref/TypeFamilies.html | 156 +++++++++++------------ 9 files changed, 210 insertions(+), 210 deletions(-) (limited to 'html-test/ref/Test.html') diff --git a/html-test/ref/Bug26.html b/html-test/ref/Bug26.html index 18bfa63b..bdb51231 100644 --- a/html-test/ref/Bug26.html +++ b/html-test/ref/Bug26.html @@ -147,11 +147,11 @@ window.onload = function () {pageLoad();setSynopsis("mini_Bug26.html");}; >
    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 From 0158692153c342eb84879338aeb99a6bb0221889 Mon Sep 17 00:00:00 2001 From: Łukasz Hanuszczak Date: Fri, 31 Jul 2015 17:05:48 +0200 Subject: Accept tests affected by adding instance details section. --- html-test/ref/Bug26.html | 22 +- html-test/ref/Bug7.html | 40 ++-- html-test/ref/Hash.html | 88 ++++++-- html-test/ref/HiddenInstances.html | 130 ++++++++++-- html-test/ref/HiddenInstancesB.html | 32 ++- html-test/ref/QuasiExpr.html | 92 +++++++- html-test/ref/SpuriousSuperclassConstraints.html | 100 +++++++-- html-test/ref/Test.html | 72 ++++++- html-test/ref/TypeFamilies.html | 256 ++++++++++++++++++----- html-test/ref/ocean.css | 14 +- 10 files changed, 712 insertions(+), 134 deletions(-) (limited to 'html-test/ref/Test.html') diff --git a/html-test/ref/Bug26.html b/html-test/ref/Bug26.html index 8b9e5a7b..e56d3821 100644 --- a/html-test/ref/Bug26.html +++ b/html-test/ref/Bug26.html @@ -147,9 +147,11 @@ window.onload = function () {pageLoad();setSynopsis("mini_Bug26.html");}; >
    O

    Fields

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

    Methods

    c_f :: ()

    Bar Foo FooJust one instance

    Bar Foo FooJust one instance

    Hash Float 

    Methods

    hash :: Float -> Int

    Hash Int 

    Methods

    hash :: Int -> Int

    (Hash a, Hash b) => Hash (a, b)
    (Hash a, Hash b) => Hash (a, b)
     

    Methods

    hash :: (a, b) -> Int

    VisibleClass Int
    VisibleClass VisibleDataShould be visible

    Num VisibleData
    VisibleClass VisibleDataShould be visible

    Foo BarShould be visible

    Foo BarShould be visible

    Show Expr 

    Methods

    showsPrec :: Int -> Expr -> ShowS

    show :: Expr -> String

    showList :: [Expr] -> ShowS

    Show BinOp 

    Methods

    showsPrec :: Int -> BinOp -> ShowS

    show :: BinOp -> String

    showList :: [BinOp] -> ShowS

    Functor (SomeType f) 

    Methods

    fmap :: (a -> b) -> SomeType f a -> SomeType f b

    (<$) :: a -> SomeType f b -> SomeType f a

    Applicative f => Applicative (SomeType f) 

    Methods

    pure :: a -> SomeType f a

    (<*>) :: SomeType f (a -> b) -> SomeType f a -> SomeType f b

    (*>) :: SomeType f a -> SomeType f b -> SomeType f b

    (<*) :: SomeType f a -> SomeType f b -> SomeType f a

    D Float 

    Methods

    d :: T Float b

    e :: (Float, Float)

    D Int 

    Methods

    d :: T Int b

    e :: (Int, Int)

    Assoc * X

    Associated Types

    data AssocD (X :: k)

    type AssocT (X :: k) :: *

    Test * X
    (><) X XX XXX 
    Assoc * Y

    Associated Types

    data AssocD (Y :: k)

    type AssocT (Y :: k) :: *

    Test * Y
    Test * Y
    Test * XDoc for: instance Test X

    Assoc * Y

    Associated Types

    data AssocD (Y :: k)

    type AssocT (Y :: k) :: *

    Assoc * XDoc for: instance Assoc X

    Associated Types

    data AssocD (X :: k)

    type AssocT (X :: k) :: *

    (><) X XX XXX 
    Date: Fri, 31 Jul 2015 18:28:16 +0200 Subject: Re-accept tests after applying deterministic section identifiers. --- html-test/ref/Bug26.html | 4 +-- html-test/ref/Bug7.html | 8 ++--- html-test/ref/Hash.html | 12 +++---- html-test/ref/HiddenInstances.html | 16 +++++----- html-test/ref/HiddenInstancesB.html | 8 ++--- html-test/ref/QuasiExpr.html | 8 ++--- html-test/ref/SpuriousSuperclassConstraints.html | 8 ++--- html-test/ref/Test.html | 8 ++--- html-test/ref/TypeFamilies.html | 40 ++++++++++++------------ 9 files changed, 56 insertions(+), 56 deletions(-) (limited to 'html-test/ref/Test.html') diff --git a/html-test/ref/Bug26.html b/html-test/ref/Bug26.html index e56d3821..18bfa63b 100644 --- a/html-test/ref/Bug26.html +++ b/html-test/ref/Bug26.html @@ -147,7 +147,7 @@ window.onload = function () {pageLoad();setSynopsis("mini_Bug26.html");}; >
    C ()

    Methods

    Methods

    Methods

    (Hash a,

    Methods

    Methods

    Methods

    Methods

    Methods

    Methods

    D

    Methods

    D

    Methods

    Associated Types

    Test *

    Associated Types

    Test *
    Test *
    Test *

    Associated Types

    Associated Types

    Methods

    (Hash a,

    Methods

    Methods

    Methods

    Methods

    Methods

    D

    Methods

    Associated Types

    Test *

    Associated Types

    Test *
    Test *
    Test *

    Associated Types

    Associated Types

    C ()
    C ()

    Methods

    Bar Foo Foo
    Bar Foo Foo
    Hash Float

    Methods

    Hash Int

    Methods

    (Hash a, Hash b) => Hash (a, b)
    (Hash a, Hash b) => Hash (a, b)
     

    Methods

    VisibleClass Int
    VisibleClass VisibleData
    Num VisibleData

    Methods

    VisibleClass VisibleData
    Foo Bar
    Foo Bar
    Show Expr

    Methods

    Show BinOp

    Methods

    Functor (SomeType f) 

    Methods

    Applicative f => Applicative (SomeType f) 

    Methods

    D Float

    Methods

    D Int

    Methods

    Assoc * X

    Associated Types

    Test * X
    (><) X XX XXX
    Assoc * Y

    Associated Types

    Test * Y
    Test * Y
    Test * X
    Assoc * Y

    Associated Types

    Assoc * X

    Associated Types

    (><) X XX XXX