diff options
Diffstat (limited to 'html-test/src')
125 files changed, 125 insertions, 0 deletions
| diff --git a/html-test/src/A.hs b/html-test/src/A.hs index 606b0865..e2319041 100644 --- a/html-test/src/A.hs +++ b/html-test/src/A.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module A where  data A = A diff --git a/html-test/src/B.hs b/html-test/src/B.hs index 5fd69acd..ce7a945c 100644 --- a/html-test/src/B.hs +++ b/html-test/src/B.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module B ( module A, test, reExport, X(..) ) where  import A ( A(..), test2, reExport, X(..) ) diff --git a/html-test/src/Bold.hs b/html-test/src/Bold.hs index 7ff28ef9..91bc6715 100644 --- a/html-test/src/Bold.hs +++ b/html-test/src/Bold.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bold where  -- | Some __bold text__.  -- diff --git a/html-test/src/Bug1.hs b/html-test/src/Bug1.hs index af1ed4d3..6df1b9e2 100644 --- a/html-test/src/Bug1.hs +++ b/html-test/src/Bug1.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug1 where  -- | We should have different anchors for constructors and types\/classes.  This diff --git a/html-test/src/Bug1004.hs b/html-test/src/Bug1004.hs index d789e77f..f2ee5f61 100644 --- a/html-test/src/Bug1004.hs +++ b/html-test/src/Bug1004.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug1004 (Product(..)) where  import Data.Functor.Product diff --git a/html-test/src/Bug1033.hs b/html-test/src/Bug1033.hs index fdf5a57e..4c80e672 100644 --- a/html-test/src/Bug1033.hs +++ b/html-test/src/Bug1033.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DeriveGeneric #-}  {-# LANGUAGE StandaloneDeriving #-} diff --git a/html-test/src/Bug1035.hs b/html-test/src/Bug1035.hs index 3516c08f..46a6dd1f 100644 --- a/html-test/src/Bug1035.hs +++ b/html-test/src/Bug1035.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug1035 where  data Foo = Bar diff --git a/html-test/src/Bug1050.hs b/html-test/src/Bug1050.hs index ea293e6e..1fe49ab7 100644 --- a/html-test/src/Bug1050.hs +++ b/html-test/src/Bug1050.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE GADTs #-}  {-# LANGUAGE PolyKinds #-}  {-# LANGUAGE RankNTypes #-} diff --git a/html-test/src/Bug1054.hs b/html-test/src/Bug1054.hs index c699f1fb..b05d79c0 100644 --- a/html-test/src/Bug1054.hs +++ b/html-test/src/Bug1054.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug1054 where  -- * Header with 'foo' link diff --git a/html-test/src/Bug1063.hs b/html-test/src/Bug1063.hs index c6d13a1f..d5b1c69f 100644 --- a/html-test/src/Bug1063.hs +++ b/html-test/src/Bug1063.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE ConstraintKinds #-}  {-# LANGUAGE FlexibleInstances #-}  {-# LANGUAGE MultiParamTypeClasses #-} diff --git a/html-test/src/Bug1067A.hs b/html-test/src/Bug1067A.hs index 57ab60b0..4523d838 100644 --- a/html-test/src/Bug1067A.hs +++ b/html-test/src/Bug1067A.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# language PatternSynonyms #-}  module Bug1067A ( Foo(P) ) where diff --git a/html-test/src/Bug1067B.hs b/html-test/src/Bug1067B.hs index f1a814df..b5ce67f6 100644 --- a/html-test/src/Bug1067B.hs +++ b/html-test/src/Bug1067B.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# language PatternSynonyms #-}  module Bug1067B ( pattern P ) where diff --git a/html-test/src/Bug1103.hs b/html-test/src/Bug1103.hs index 1f387e62..c790e8c1 100644 --- a/html-test/src/Bug1103.hs +++ b/html-test/src/Bug1103.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DataKinds #-}  {-# LANGUAGE GADTs #-}  {-# LANGUAGE PolyKinds #-} diff --git a/html-test/src/Bug195.hs b/html-test/src/Bug195.hs index 14440e8d..304e0c2e 100644 --- a/html-test/src/Bug195.hs +++ b/html-test/src/Bug195.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug195 where  data T = A { someField :: () -- ^ Doc for someField of A diff --git a/html-test/src/Bug2.hs b/html-test/src/Bug2.hs index 9121922e..6dc79f46 100644 --- a/html-test/src/Bug2.hs +++ b/html-test/src/Bug2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug2 ( x ) where  import B  x :: A diff --git a/html-test/src/Bug201.hs b/html-test/src/Bug201.hs index bf6cb9a9..caa92d95 100644 --- a/html-test/src/Bug201.hs +++ b/html-test/src/Bug201.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- We test that leading whitespace gets properly dropped (or not!)  -- from codeblocks  module Bug201 where diff --git a/html-test/src/Bug253.hs b/html-test/src/Bug253.hs index 499f6cd4..29a3adc6 100644 --- a/html-test/src/Bug253.hs +++ b/html-test/src/Bug253.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | This module tests that if we're trying to link to a /qualified/  -- identifier that's not in scope, we get an anchor as if it was a  -- variable. Previous behaviour was to treat it as a type constructor diff --git a/html-test/src/Bug26.hs b/html-test/src/Bug26.hs index b0483f03..8b9c4162 100644 --- a/html-test/src/Bug26.hs +++ b/html-test/src/Bug26.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | This module tests the ‘@since …’ annotation.  --  -- @since 1.2.3 diff --git a/html-test/src/Bug280.hs b/html-test/src/Bug280.hs index ac27e2e5..d53def96 100644 --- a/html-test/src/Bug280.hs +++ b/html-test/src/Bug280.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-|  Copyright: Foo,             Bar, diff --git a/html-test/src/Bug294.hs b/html-test/src/Bug294.hs index 4f874705..922b8ee7 100644 --- a/html-test/src/Bug294.hs +++ b/html-test/src/Bug294.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeFamilies, FlexibleInstances, GADTs #-}  -- This tests that we are able to extract record selectors for  -- associated types when the type itself is not exported. Making this diff --git a/html-test/src/Bug298.hs b/html-test/src/Bug298.hs index 07d6fa0c..7ab9d21b 100644 --- a/html-test/src/Bug298.hs +++ b/html-test/src/Bug298.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- We introduced a regression in 2.14.x where we don't consider  -- identifiers with ^ as valid. We test that the regression goes away  -- here. It's a silly typo in the parser, really. Same with ★ which is a valid diff --git a/html-test/src/Bug3.hs b/html-test/src/Bug3.hs index 67e57892..1b7e5277 100644 --- a/html-test/src/Bug3.hs +++ b/html-test/src/Bug3.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug3 where  -- | /multi-line diff --git a/html-test/src/Bug308.hs b/html-test/src/Bug308.hs index 3adb3746..93ecffac 100644 --- a/html-test/src/Bug308.hs +++ b/html-test/src/Bug308.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- From 2.14.x onwards we were forgetting to swallow ‘#’ as a special  -- character resulting in broken anchors if they accured  -- mid-paragraph. Here we check that anchors get generated as diff --git a/html-test/src/Bug308CrossModule.hs b/html-test/src/Bug308CrossModule.hs index 589aa69e..45c89040 100644 --- a/html-test/src/Bug308CrossModule.hs +++ b/html-test/src/Bug308CrossModule.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- Just like Bug308 module but here we test that referring to anchors  -- from other modules works.  module Bug308CrossModule where diff --git a/html-test/src/Bug310.hs b/html-test/src/Bug310.hs index d2492dc0..c54eab81 100644 --- a/html-test/src/Bug310.hs +++ b/html-test/src/Bug310.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE ExplicitNamespaces #-}  module Bug310 ( type (+) ) where diff --git a/html-test/src/Bug313.hs b/html-test/src/Bug313.hs index 90d4d3b6..c076c5b8 100644 --- a/html-test/src/Bug313.hs +++ b/html-test/src/Bug313.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | The first list is incorrectly numbered as 1. 2. 1.; the second example  -- renders fine (1. 2. 3.).  -- diff --git a/html-test/src/Bug335.hs b/html-test/src/Bug335.hs index c1821dd0..45668307 100644 --- a/html-test/src/Bug335.hs +++ b/html-test/src/Bug335.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- Tests for collapsable headers  module Bug335 where diff --git a/html-test/src/Bug4.hs b/html-test/src/Bug4.hs index 425a77aa..3343e1b9 100644 --- a/html-test/src/Bug4.hs +++ b/html-test/src/Bug4.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug4 where  -- | don't use apostrophe's in the wrong place's  foo :: Int diff --git a/html-test/src/Bug458.hs b/html-test/src/Bug458.hs index 6a3ac9a4..b0fefecf 100644 --- a/html-test/src/Bug458.hs +++ b/html-test/src/Bug458.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug458 where  -- | See the defn of @'⊆'@. diff --git a/html-test/src/Bug466.hs b/html-test/src/Bug466.hs index ec7cde2c..697f0f75 100644 --- a/html-test/src/Bug466.hs +++ b/html-test/src/Bug466.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DataKinds, TypeFamilies, StarIsType #-}  module Bug466 where diff --git a/html-test/src/Bug546.hs b/html-test/src/Bug546.hs index 4493b1d9..e1df6aca 100644 --- a/html-test/src/Bug546.hs +++ b/html-test/src/Bug546.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug546 where  -- |Test: diff --git a/html-test/src/Bug548.hs b/html-test/src/Bug548.hs index 652d3d32..c890a207 100644 --- a/html-test/src/Bug548.hs +++ b/html-test/src/Bug548.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug548 (WrappedArrow(..)) where  import Control.Applicative diff --git a/html-test/src/Bug6.hs b/html-test/src/Bug6.hs index 17411f31..de2874aa 100644 --- a/html-test/src/Bug6.hs +++ b/html-test/src/Bug6.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | Exporting records.  module Bug6( A(A), B(B), b, C(C,c1,c2), D(D,d1), E(E) ) where diff --git a/html-test/src/Bug613.hs b/html-test/src/Bug613.hs index effef695..3bdd0ac2 100644 --- a/html-test/src/Bug613.hs +++ b/html-test/src/Bug613.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug613  where  import Prelude (Either(Left, Right)) diff --git a/html-test/src/Bug647.hs b/html-test/src/Bug647.hs index 4143092a..7f1b9544 100644 --- a/html-test/src/Bug647.hs +++ b/html-test/src/Bug647.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug647 where  class Bug647 a where diff --git a/html-test/src/Bug679.hs b/html-test/src/Bug679.hs index 0a321ec5..3cc2278f 100644 --- a/html-test/src/Bug679.hs +++ b/html-test/src/Bug679.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell #-}  module Bug679 where diff --git a/html-test/src/Bug7.hs b/html-test/src/Bug7.hs index a07934c4..aeb7d96e 100644 --- a/html-test/src/Bug7.hs +++ b/html-test/src/Bug7.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE MultiParamTypeClasses #-}  -- | This module caused a duplicate instance in the documentation for the Foo  -- type. diff --git a/html-test/src/Bug745.hs b/html-test/src/Bug745.hs index f26562c1..295ac59d 100644 --- a/html-test/src/Bug745.hs +++ b/html-test/src/Bug745.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell, QuasiQuotes #-}  module Bug574 where diff --git a/html-test/src/Bug8.hs b/html-test/src/Bug8.hs index 30afae1f..1b50ce9c 100644 --- a/html-test/src/Bug8.hs +++ b/html-test/src/Bug8.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug8 where  infix --> diff --git a/html-test/src/Bug85.hs b/html-test/src/Bug85.hs index e29b2662..53979aee 100644 --- a/html-test/src/Bug85.hs +++ b/html-test/src/Bug85.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE GADTs, KindSignatures #-}  module Bug85 where diff --git a/html-test/src/Bug865.hs b/html-test/src/Bug865.hs index 71a6add1..86627f8e 100644 --- a/html-test/src/Bug865.hs +++ b/html-test/src/Bug865.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug865 where  -- | An emphasized link [yes /this/ is emphasized while this is diff --git a/html-test/src/Bug923.hs b/html-test/src/Bug923.hs index bb5bca0a..1d24a9f6 100644 --- a/html-test/src/Bug923.hs +++ b/html-test/src/Bug923.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE KindSignatures, FlexibleInstances, GADTs, DataKinds #-}  module Bug923 where diff --git a/html-test/src/Bug952.hs b/html-test/src/Bug952.hs index 09b365e4..0840e46c 100644 --- a/html-test/src/Bug952.hs +++ b/html-test/src/Bug952.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug952 where  -- | See 'case', 'of', '--' compared to 'Q.case', 'Q.of', 'Q.--' diff --git a/html-test/src/Bug953.hs b/html-test/src/Bug953.hs index 63f2c45a..4ff3e8ae 100644 --- a/html-test/src/Bug953.hs +++ b/html-test/src/Bug953.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bug953 where  {- | A foo diff --git a/html-test/src/Bug975.hs b/html-test/src/Bug975.hs index 97ebabda..e55385c5 100644 --- a/html-test/src/Bug975.hs +++ b/html-test/src/Bug975.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE ExplicitForAll #-}  module Bug973 where diff --git a/html-test/src/BugDeprecated.hs b/html-test/src/BugDeprecated.hs index 7741786f..9dfef176 100644 --- a/html-test/src/BugDeprecated.hs +++ b/html-test/src/BugDeprecated.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module BugDeprecated where  foo :: Int diff --git a/html-test/src/BugExportHeadings.hs b/html-test/src/BugExportHeadings.hs index a5493a08..b664a448 100644 --- a/html-test/src/BugExportHeadings.hs +++ b/html-test/src/BugExportHeadings.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- test for #192  module BugExportHeadings (  -- * Foo diff --git a/html-test/src/Bugs.hs b/html-test/src/Bugs.hs index e60bbe8f..aed716a4 100644 --- a/html-test/src/Bugs.hs +++ b/html-test/src/Bugs.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Bugs where  data A a = A a (a -> Int) diff --git a/html-test/src/BundledPatterns.hs b/html-test/src/BundledPatterns.hs index 443e64fa..420068ac 100644 --- a/html-test/src/BundledPatterns.hs +++ b/html-test/src/BundledPatterns.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DataKinds, GADTs, KindSignatures, PatternSynonyms, TypeOperators,               ViewPatterns #-}  module BundledPatterns (Vec(Nil,(:>)), RTree (LR,BR)) where diff --git a/html-test/src/BundledPatterns2.hs b/html-test/src/BundledPatterns2.hs index 5e9a83a7..c4123535 100644 --- a/html-test/src/BundledPatterns2.hs +++ b/html-test/src/BundledPatterns2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DataKinds, GADTs, KindSignatures, PatternSynonyms, TypeOperators,               ViewPatterns #-}  module BundledPatterns2 (Vec((:>), Empty), RTree(..)) where diff --git a/html-test/src/ConstructorArgs.hs b/html-test/src/ConstructorArgs.hs index 6b0da711..c3b848c3 100644 --- a/html-test/src/ConstructorArgs.hs +++ b/html-test/src/ConstructorArgs.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE GADTs, PatternSynonyms #-}  module ConstructorArgs (Foo(..), Boo(Foo, Foa, Fo, Fo'), pattern Bo, pattern Bo') where diff --git a/html-test/src/ConstructorPatternExport.hs b/html-test/src/ConstructorPatternExport.hs index 7897b4bc..aa2971d6 100644 --- a/html-test/src/ConstructorPatternExport.hs +++ b/html-test/src/ConstructorPatternExport.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE PatternSynonyms #-}  {-# LANGUAGE ExistentialQuantification #-}  {-# LANGUAGE GADTs #-} diff --git a/html-test/src/DefaultAssociatedTypes.hs b/html-test/src/DefaultAssociatedTypes.hs index 6ad197d3..340742d3 100644 --- a/html-test/src/DefaultAssociatedTypes.hs +++ b/html-test/src/DefaultAssociatedTypes.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DefaultSignatures, TypeFamilies #-}  module DefaultAssociatedTypes where diff --git a/html-test/src/DefaultSignatures.hs b/html-test/src/DefaultSignatures.hs index 52d68a96..1b1b8257 100644 --- a/html-test/src/DefaultSignatures.hs +++ b/html-test/src/DefaultSignatures.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DefaultSignatures #-}  module DefaultSignatures where diff --git a/html-test/src/DeprecatedClass.hs b/html-test/src/DeprecatedClass.hs index 018904ab..357f64e4 100644 --- a/html-test/src/DeprecatedClass.hs +++ b/html-test/src/DeprecatedClass.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedClass where  -- | some class diff --git a/html-test/src/DeprecatedData.hs b/html-test/src/DeprecatedData.hs index c40ba122..f2324162 100644 --- a/html-test/src/DeprecatedData.hs +++ b/html-test/src/DeprecatedData.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeFamilies #-}  module DeprecatedData where diff --git a/html-test/src/DeprecatedFunction.hs b/html-test/src/DeprecatedFunction.hs index 8d626435..2c6418d3 100644 --- a/html-test/src/DeprecatedFunction.hs +++ b/html-test/src/DeprecatedFunction.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedFunction where  -- | some documentation for foo diff --git a/html-test/src/DeprecatedFunction2.hs b/html-test/src/DeprecatedFunction2.hs index bdbbf95c..fb4193f2 100644 --- a/html-test/src/DeprecatedFunction2.hs +++ b/html-test/src/DeprecatedFunction2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedFunction2 where diff --git a/html-test/src/DeprecatedFunction3.hs b/html-test/src/DeprecatedFunction3.hs index ca719bda..4a286e0a 100644 --- a/html-test/src/DeprecatedFunction3.hs +++ b/html-test/src/DeprecatedFunction3.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedFunction3 where diff --git a/html-test/src/DeprecatedModule.hs b/html-test/src/DeprecatedModule.hs index 369dba4f..179b5899 100644 --- a/html-test/src/DeprecatedModule.hs +++ b/html-test/src/DeprecatedModule.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | Documentation for "DeprecatedModule".  module DeprecatedModule {-# DEPRECATED "Use \"Foo\" instead" #-} where diff --git a/html-test/src/DeprecatedModule2.hs b/html-test/src/DeprecatedModule2.hs index 94185297..ccec1be7 100644 --- a/html-test/src/DeprecatedModule2.hs +++ b/html-test/src/DeprecatedModule2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedModule2 {-# DEPRECATED "Use Foo instead" #-} where  foo :: Int diff --git a/html-test/src/DeprecatedNewtype.hs b/html-test/src/DeprecatedNewtype.hs index 254f1f55..6aeead44 100644 --- a/html-test/src/DeprecatedNewtype.hs +++ b/html-test/src/DeprecatedNewtype.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedNewtype where  -- | some documentation diff --git a/html-test/src/DeprecatedReExport.hs b/html-test/src/DeprecatedReExport.hs index f851e2ff..061c9c27 100644 --- a/html-test/src/DeprecatedReExport.hs +++ b/html-test/src/DeprecatedReExport.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- |  -- What is tested here:  -- diff --git a/html-test/src/DeprecatedRecord.hs b/html-test/src/DeprecatedRecord.hs index d44499e7..9fe0240d 100644 --- a/html-test/src/DeprecatedRecord.hs +++ b/html-test/src/DeprecatedRecord.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedRecord where  -- | type Foo diff --git a/html-test/src/DeprecatedTypeFamily.hs b/html-test/src/DeprecatedTypeFamily.hs index 70473bb8..3d94cace 100644 --- a/html-test/src/DeprecatedTypeFamily.hs +++ b/html-test/src/DeprecatedTypeFamily.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeFamilies #-}  module DeprecatedTypeFamily where diff --git a/html-test/src/DeprecatedTypeSynonym.hs b/html-test/src/DeprecatedTypeSynonym.hs index 34df47da..05fb9bdc 100644 --- a/html-test/src/DeprecatedTypeSynonym.hs +++ b/html-test/src/DeprecatedTypeSynonym.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module DeprecatedTypeSynonym where diff --git a/html-test/src/DuplicateRecordFields.hs b/html-test/src/DuplicateRecordFields.hs index 2cf9ff43..59441750 100644 --- a/html-test/src/DuplicateRecordFields.hs +++ b/html-test/src/DuplicateRecordFields.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DuplicateRecordFields #-}  module DuplicateRecordFields (RawReplay(..)) where diff --git a/html-test/src/Examples.hs b/html-test/src/Examples.hs index c8c450f1..b518ea70 100644 --- a/html-test/src/Examples.hs +++ b/html-test/src/Examples.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Examples where  -- | Fibonacci number of given 'Integer'. diff --git a/html-test/src/Extensions.hs b/html-test/src/Extensions.hs index 61eac219..bbaa6395 100644 --- a/html-test/src/Extensions.hs +++ b/html-test/src/Extensions.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE Haskell2010, ExplicitForAll, MonomorphismRestriction #-}  {-# OPTIONS_HADDOCK show-extensions #-}  module Extensions where diff --git a/html-test/src/FunArgs.hs b/html-test/src/FunArgs.hs index e20bcda7..9d7c19dc 100644 --- a/html-test/src/FunArgs.hs +++ b/html-test/src/FunArgs.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE RankNTypes, DataKinds, TypeFamilies #-}  module FunArgs where diff --git a/html-test/src/GADTRecords.hs b/html-test/src/GADTRecords.hs index dcbbb870..015027d2 100644 --- a/html-test/src/GADTRecords.hs +++ b/html-test/src/GADTRecords.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE GADTs #-}  module GADTRecords (H1(..)) where diff --git a/html-test/src/GadtConstructorArgs.hs b/html-test/src/GadtConstructorArgs.hs index 79ffb4d3..6d742bd7 100644 --- a/html-test/src/GadtConstructorArgs.hs +++ b/html-test/src/GadtConstructorArgs.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE GADTs, PatternSynonyms #-}  module GadtConstructorArgs (Boo(..)) where diff --git a/html-test/src/Hash.hs b/html-test/src/Hash.hs index 1eb8af5b..ce40fdd3 100644 --- a/html-test/src/Hash.hs +++ b/html-test/src/Hash.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {- |    Implementation of fixed-size hash tables, with a type    class for constructing hash values for structured types. diff --git a/html-test/src/Hidden.hs b/html-test/src/Hidden.hs index 896da648..2b694e86 100644 --- a/html-test/src/Hidden.hs +++ b/html-test/src/Hidden.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# OPTIONS_HADDOCK hide #-}  module Hidden where diff --git a/html-test/src/HiddenInstances.hs b/html-test/src/HiddenInstances.hs index 99a6c2fd..a9124098 100644 --- a/html-test/src/HiddenInstances.hs +++ b/html-test/src/HiddenInstances.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- http://trac.haskell.org/haddock/ticket/37  module HiddenInstances (VisibleClass, VisibleData) where diff --git a/html-test/src/HiddenInstancesA.hs b/html-test/src/HiddenInstancesA.hs index f1775208..8879868c 100644 --- a/html-test/src/HiddenInstancesA.hs +++ b/html-test/src/HiddenInstancesA.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# OPTIONS_HADDOCK hide #-}  module HiddenInstancesA where diff --git a/html-test/src/HiddenInstancesB.hs b/html-test/src/HiddenInstancesB.hs index eabf0637..0def0ecc 100644 --- a/html-test/src/HiddenInstancesB.hs +++ b/html-test/src/HiddenInstancesB.hs @@ -1,2 +1,3 @@ +{-# LANGUAGE Haskell2010 #-}  module HiddenInstancesB (Foo, Bar) where  import HiddenInstancesA diff --git a/html-test/src/Hyperlinks.hs b/html-test/src/Hyperlinks.hs index 34e64448..f64a5bb1 100644 --- a/html-test/src/Hyperlinks.hs +++ b/html-test/src/Hyperlinks.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Hyperlinks where  -- | diff --git a/html-test/src/Identifiers.hs b/html-test/src/Identifiers.hs index 75f12109..13ee3b82 100644 --- a/html-test/src/Identifiers.hs +++ b/html-test/src/Identifiers.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeOperators #-}  module Identifiers where diff --git a/html-test/src/IgnoreExports.hs b/html-test/src/IgnoreExports.hs index edb7c4c1..2016d3d5 100644 --- a/html-test/src/IgnoreExports.hs +++ b/html-test/src/IgnoreExports.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# OPTIONS_HADDOCK ignore-exports #-}  module IgnoreExports (Foo, foo) where diff --git a/html-test/src/ImplicitParams.hs b/html-test/src/ImplicitParams.hs index 3ca9157b..8635b2a4 100644 --- a/html-test/src/ImplicitParams.hs +++ b/html-test/src/ImplicitParams.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE ImplicitParams, RankNTypes #-}  module ImplicitParams where diff --git a/html-test/src/Instances.hs b/html-test/src/Instances.hs index 545c8534..e9537a92 100644 --- a/html-test/src/Instances.hs +++ b/html-test/src/Instances.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE MultiParamTypeClasses #-}  {-# LANGUAGE FlexibleInstances #-}  {-# LANGUAGE FlexibleContexts #-} diff --git a/html-test/src/LinearTypes.hs b/html-test/src/LinearTypes.hs index cb4eb138..c4f9c84f 100644 --- a/html-test/src/LinearTypes.hs +++ b/html-test/src/LinearTypes.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE LinearTypes #-}  module LinearTypes where diff --git a/html-test/src/Math.hs b/html-test/src/Math.hs index 75bc513e..375dbc2d 100644 --- a/html-test/src/Math.hs +++ b/html-test/src/Math.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | Math (display) for 'normalDensity'  --  -- \[ diff --git a/html-test/src/Minimal.hs b/html-test/src/Minimal.hs index 9df03cca..ec275aec 100644 --- a/html-test/src/Minimal.hs +++ b/html-test/src/Minimal.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | This tests the new MINIMAL pragma present in GHC 7.8  module Minimal    ( Foo(..) diff --git a/html-test/src/ModuleWithWarning.hs b/html-test/src/ModuleWithWarning.hs index e64d9d7e..710589bf 100644 --- a/html-test/src/ModuleWithWarning.hs +++ b/html-test/src/ModuleWithWarning.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | Documentation for "ModuleWithWarning".  module ModuleWithWarning {-# WARNING "This is an unstable interface.  Prefer functions from \"Prelude\" instead!" #-} where diff --git a/html-test/src/NamedDoc.hs b/html-test/src/NamedDoc.hs index 7c04ba72..8ac40921 100644 --- a/html-test/src/NamedDoc.hs +++ b/html-test/src/NamedDoc.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module NamedDoc where  -- $foo bar diff --git a/html-test/src/NamespacedIdentifiers.hs b/html-test/src/NamespacedIdentifiers.hs index 6f59d247..38fb7101 100644 --- a/html-test/src/NamespacedIdentifiers.hs +++ b/html-test/src/NamespacedIdentifiers.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module NamespacedIdentifiers where  -- | A link to: diff --git a/html-test/src/Nesting.hs b/html-test/src/Nesting.hs index f88be87d..fa45e11b 100644 --- a/html-test/src/Nesting.hs +++ b/html-test/src/Nesting.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Nesting where  {-| diff --git a/html-test/src/NoLayout.hs b/html-test/src/NoLayout.hs index 19b38b1d..e07470a3 100644 --- a/html-test/src/NoLayout.hs +++ b/html-test/src/NoLayout.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- Haddock comments are parsed as separate declarations so we  -- need to insert a ';' when using them with explicit layout. diff --git a/html-test/src/NonGreedy.hs b/html-test/src/NonGreedy.hs index f51b55f5..b89b0723 100644 --- a/html-test/src/NonGreedy.hs +++ b/html-test/src/NonGreedy.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module NonGreedy where  -- | <url1> <url2> diff --git a/html-test/src/Operators.hs b/html-test/src/Operators.hs index 0b633c3f..c303c8bd 100644 --- a/html-test/src/Operators.hs +++ b/html-test/src/Operators.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE PatternSynonyms, TypeOperators, TypeFamilies, MultiParamTypeClasses, GADTs #-}  {-# LANGUAGE FunctionalDependencies #-} diff --git a/html-test/src/OrphanInstances.hs b/html-test/src/OrphanInstances.hs index e50327ee..e7a24c45 100644 --- a/html-test/src/OrphanInstances.hs +++ b/html-test/src/OrphanInstances.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module OrphanInstances where  import OrphanInstancesType diff --git a/html-test/src/OrphanInstancesClass.hs b/html-test/src/OrphanInstancesClass.hs index 4b51acfc..d5cbf708 100644 --- a/html-test/src/OrphanInstancesClass.hs +++ b/html-test/src/OrphanInstancesClass.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module OrphanInstancesClass (AClass(..)) where  class AClass a where diff --git a/html-test/src/OrphanInstancesType.hs b/html-test/src/OrphanInstancesType.hs index b3c3145e..8a48b93e 100644 --- a/html-test/src/OrphanInstancesType.hs +++ b/html-test/src/OrphanInstancesType.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module OrphanInstancesType (AType(..)) where  data AType = AType Int diff --git a/html-test/src/PR643.hs b/html-test/src/PR643.hs index 565e5b57..a6ad81ee 100644 --- a/html-test/src/PR643.hs +++ b/html-test/src/PR643.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module PR643 (test) where  import PR643_1 diff --git a/html-test/src/PR643_1.hs b/html-test/src/PR643_1.hs index ecd0db94..67dabee3 100644 --- a/html-test/src/PR643_1.hs +++ b/html-test/src/PR643_1.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module PR643_1 where  infixr 5 `test` diff --git a/html-test/src/PatternSyns.hs b/html-test/src/PatternSyns.hs index bf0f7848..e0da6d6b 100644 --- a/html-test/src/PatternSyns.hs +++ b/html-test/src/PatternSyns.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE ExistentialQuantification, PatternSynonyms, PolyKinds, TypeOperators #-}  -- | Testing some pattern synonyms diff --git a/html-test/src/PromotedTypes.hs b/html-test/src/PromotedTypes.hs index ae3ad375..624f9d5a 100644 --- a/html-test/src/PromotedTypes.hs +++ b/html-test/src/PromotedTypes.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE DataKinds #-}  {-# LANGUAGE GADTs #-}  {-# LANGUAGE KindSignatures #-} diff --git a/html-test/src/Properties.hs b/html-test/src/Properties.hs index 05930ece..8b1409f3 100644 --- a/html-test/src/Properties.hs +++ b/html-test/src/Properties.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Properties where  -- | Fibonacci number of given 'Integer'. diff --git a/html-test/src/PruneWithWarning.hs b/html-test/src/PruneWithWarning.hs index bfa55ea2..c2f746f0 100644 --- a/html-test/src/PruneWithWarning.hs +++ b/html-test/src/PruneWithWarning.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# OPTIONS_HADDOCK prune #-}  -- |  -- What is tested here: diff --git a/html-test/src/QuantifiedConstraints.hs b/html-test/src/QuantifiedConstraints.hs index 82dd81e5..4f96b322 100644 --- a/html-test/src/QuantifiedConstraints.hs +++ b/html-test/src/QuantifiedConstraints.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE QuantifiedConstraints #-}  module QuantifiedConstraints where diff --git a/html-test/src/QuasiExpr.hs b/html-test/src/QuasiExpr.hs index 970759ba..d81fcf8b 100644 --- a/html-test/src/QuasiExpr.hs +++ b/html-test/src/QuasiExpr.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell #-}  -- Used by QuasiQuote. Example taken from the GHC documentation. diff --git a/html-test/src/QuasiQuote.hs b/html-test/src/QuasiQuote.hs index 06762cf9..fe900eb8 100644 --- a/html-test/src/QuasiQuote.hs +++ b/html-test/src/QuasiQuote.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell, QuasiQuotes #-}  -- example taken from the GHC documentation diff --git a/html-test/src/SectionLabels.hs b/html-test/src/SectionLabels.hs index 560bafa4..0017bd72 100644 --- a/html-test/src/SectionLabels.hs +++ b/html-test/src/SectionLabels.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module SectionLabels    (      -- * Section heading#custom# diff --git a/html-test/src/SpuriousSuperclassConstraints.hs b/html-test/src/SpuriousSuperclassConstraints.hs index 3e230945..cb204941 100644 --- a/html-test/src/SpuriousSuperclassConstraints.hs +++ b/html-test/src/SpuriousSuperclassConstraints.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE EmptyDataDecls, KindSignatures #-}  -- |  -- What is tested here: diff --git a/html-test/src/TH.hs b/html-test/src/TH.hs index f8178bcb..2692ae42 100644 --- a/html-test/src/TH.hs +++ b/html-test/src/TH.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell #-}  module TH where diff --git a/html-test/src/TH2.hs b/html-test/src/TH2.hs index ea85e547..f878b1e0 100644 --- a/html-test/src/TH2.hs +++ b/html-test/src/TH2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell #-}  module TH2 where diff --git a/html-test/src/Table.hs b/html-test/src/Table.hs index 2cf0c662..4ffbc9b3 100644 --- a/html-test/src/Table.hs +++ b/html-test/src/Table.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | This tests the table markup  module Table    ( tableWithHeader diff --git a/html-test/src/Test.hs b/html-test/src/Test.hs index e94cc414..a809f337 100644 --- a/html-test/src/Test.hs +++ b/html-test/src/Test.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -----------------------------------------------------------------------------  -- |  -- Module      :  Test diff --git a/html-test/src/Threaded.hs b/html-test/src/Threaded.hs index 7f3073ad..afe38c27 100644 --- a/html-test/src/Threaded.hs +++ b/html-test/src/Threaded.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TemplateHaskell #-}  -- | Ensures haddock built with @-threaded@. diff --git a/html-test/src/Threaded_TH.hs b/html-test/src/Threaded_TH.hs index 53e5a399..8179f090 100644 --- a/html-test/src/Threaded_TH.hs +++ b/html-test/src/Threaded_TH.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  -- | Imported by 'Threaded', since a TH splice can't be used in the  -- module where it is defined.  module Threaded_TH where diff --git a/html-test/src/Ticket112.hs b/html-test/src/Ticket112.hs index c9cd5117..db7f3ed0 100644 --- a/html-test/src/Ticket112.hs +++ b/html-test/src/Ticket112.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE MagicHash #-}  module Ticket112 where diff --git a/html-test/src/Ticket61.hs b/html-test/src/Ticket61.hs index 26ca287f..c80e1c75 100644 --- a/html-test/src/Ticket61.hs +++ b/html-test/src/Ticket61.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Ticket61 (module Ticket61_Hidden) where  import Ticket61_Hidden diff --git a/html-test/src/Ticket61_Hidden.hs b/html-test/src/Ticket61_Hidden.hs index 583c10cd..f3654cfc 100644 --- a/html-test/src/Ticket61_Hidden.hs +++ b/html-test/src/Ticket61_Hidden.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# OPTIONS_HADDOCK hide #-}  module Ticket61_Hidden where diff --git a/html-test/src/Ticket75.hs b/html-test/src/Ticket75.hs index 5fc704d6..743ffd60 100644 --- a/html-test/src/Ticket75.hs +++ b/html-test/src/Ticket75.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeOperators #-}  module Ticket75 where diff --git a/html-test/src/TitledPicture.hs b/html-test/src/TitledPicture.hs index 7029d98a..69d44397 100644 --- a/html-test/src/TitledPicture.hs +++ b/html-test/src/TitledPicture.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module TitledPicture where  -- | Picture for 'foo' without a title <<bar>> diff --git a/html-test/src/TypeFamilies.hs b/html-test/src/TypeFamilies.hs index a79d503e..d759af4f 100644 --- a/html-test/src/TypeFamilies.hs +++ b/html-test/src/TypeFamilies.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeFamilies, UndecidableInstances, PolyKinds, TypeOperators, DataKinds, MultiParamTypeClasses, GADTs #-}  -- | Doc for: module TypeFamilies diff --git a/html-test/src/TypeFamilies2.hs b/html-test/src/TypeFamilies2.hs index b66acbfa..c1211319 100644 --- a/html-test/src/TypeFamilies2.hs +++ b/html-test/src/TypeFamilies2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeFamilies #-}  -- This tests what happens if we have unexported types  -- in type instances. The expected behaviour is diff --git a/html-test/src/TypeFamilies3.hs b/html-test/src/TypeFamilies3.hs index bde05fb8..80279e36 100644 --- a/html-test/src/TypeFamilies3.hs +++ b/html-test/src/TypeFamilies3.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeFamilies #-}  module TypeFamilies3 where diff --git a/html-test/src/TypeOperators.hs b/html-test/src/TypeOperators.hs index e69e89cb..e82d065d 100644 --- a/html-test/src/TypeOperators.hs +++ b/html-test/src/TypeOperators.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE TypeOperators, GADTs, MultiParamTypeClasses, FlexibleContexts #-}  module TypeOperators where diff --git a/html-test/src/UnboxedStuff.hs b/html-test/src/UnboxedStuff.hs index bd1b1302..dfeb7429 100644 --- a/html-test/src/UnboxedStuff.hs +++ b/html-test/src/UnboxedStuff.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  {-# LANGUAGE UnboxedSums, UnboxedTuples #-}  module UnboxedStuff where diff --git a/html-test/src/Unicode.hs b/html-test/src/Unicode.hs index d5bbf445..ecd195cf 100644 --- a/html-test/src/Unicode.hs +++ b/html-test/src/Unicode.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Unicode where  -- | γλώσσα diff --git a/html-test/src/Unicode2.hs b/html-test/src/Unicode2.hs index ca6b18ba..19925a4f 100644 --- a/html-test/src/Unicode2.hs +++ b/html-test/src/Unicode2.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Unicode2 where  -- | All of the following work with a unicode character ü: diff --git a/html-test/src/Visible.hs b/html-test/src/Visible.hs index cad71931..9440aeef 100644 --- a/html-test/src/Visible.hs +++ b/html-test/src/Visible.hs @@ -1,3 +1,4 @@ +{-# LANGUAGE Haskell2010 #-}  module Visible where  visible :: Int -> Int  visible a = a | 
