diff options
Diffstat (limited to 'compiler/hsSyn')
-rw-r--r-- | compiler/hsSyn/Convert.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsBinds.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsDecls.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsDoc.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsDumpAst.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsExpr.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsExtension.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsImpExp.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsLit.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsPat.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsSyn.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsTypes.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/HsUtils.hs | 2 | ||||
-rw-r--r-- | compiler/hsSyn/PlaceHolder.hs | 2 |
14 files changed, 28 insertions, 0 deletions
diff --git a/compiler/hsSyn/Convert.hs b/compiler/hsSyn/Convert.hs index 727a04adca..f9e5ca1958 100644 --- a/compiler/hsSyn/Convert.hs +++ b/compiler/hsSyn/Convert.hs @@ -13,6 +13,8 @@ module Convert( convertToHsExpr, convertToPat, convertToHsDecls, convertToHsType, thRdrNameGuesses ) where +import GhcPrelude + import HsSyn as Hs import qualified Class import RdrName diff --git a/compiler/hsSyn/HsBinds.hs b/compiler/hsSyn/HsBinds.hs index 089e2440f6..6648cda42a 100644 --- a/compiler/hsSyn/HsBinds.hs +++ b/compiler/hsSyn/HsBinds.hs @@ -17,6 +17,8 @@ Datatype for: @BindGroup@, @Bind@, @Sig@, @Bind@. module HsBinds where +import GhcPrelude + import {-# SOURCE #-} HsExpr ( pprExpr, LHsExpr, MatchGroup, pprFunBind, GRHSs, pprPatBind ) diff --git a/compiler/hsSyn/HsDecls.hs b/compiler/hsSyn/HsDecls.hs index cb67be8ed7..ecb11a08d6 100644 --- a/compiler/hsSyn/HsDecls.hs +++ b/compiler/hsSyn/HsDecls.hs @@ -87,6 +87,8 @@ module HsDecls ( ) where -- friends: +import GhcPrelude + import {-# SOURCE #-} HsExpr( LHsExpr, HsExpr, HsSplice, pprExpr, pprSpliceDecl ) -- Because Expr imports Decls via HsBracket diff --git a/compiler/hsSyn/HsDoc.hs b/compiler/hsSyn/HsDoc.hs index d9c5dba296..7c6bdd9431 100644 --- a/compiler/hsSyn/HsDoc.hs +++ b/compiler/hsSyn/HsDoc.hs @@ -8,6 +8,8 @@ module HsDoc ( #include "HsVersions.h" +import GhcPrelude + import Outputable import SrcLoc import FastString diff --git a/compiler/hsSyn/HsDumpAst.hs b/compiler/hsSyn/HsDumpAst.hs index 8ab9cd40fa..1a1c259c01 100644 --- a/compiler/hsSyn/HsDumpAst.hs +++ b/compiler/hsSyn/HsDumpAst.hs @@ -15,6 +15,8 @@ module HsDumpAst ( BlankSrcSpan(..), ) where +import GhcPrelude + import Data.Data hiding (Fixity) import Bag import BasicTypes diff --git a/compiler/hsSyn/HsExpr.hs b/compiler/hsSyn/HsExpr.hs index 2186a728f2..5ee359e6b3 100644 --- a/compiler/hsSyn/HsExpr.hs +++ b/compiler/hsSyn/HsExpr.hs @@ -18,6 +18,8 @@ module HsExpr where #include "HsVersions.h" -- friends: +import GhcPrelude + import HsDecls import HsPat import HsLit diff --git a/compiler/hsSyn/HsExtension.hs b/compiler/hsSyn/HsExtension.hs index 880f7096c6..80dfa67ea3 100644 --- a/compiler/hsSyn/HsExtension.hs +++ b/compiler/hsSyn/HsExtension.hs @@ -13,6 +13,8 @@ module HsExtension where -- This module captures the type families to precisely identify the extension -- points for HsSyn +import GhcPrelude + import GHC.Exts (Constraint) import Data.Data hiding ( Fixity ) import PlaceHolder diff --git a/compiler/hsSyn/HsImpExp.hs b/compiler/hsSyn/HsImpExp.hs index 79ff2876aa..2930b51ee2 100644 --- a/compiler/hsSyn/HsImpExp.hs +++ b/compiler/hsSyn/HsImpExp.hs @@ -14,6 +14,8 @@ HsImpExp: Abstract syntax: imports, exports, interfaces module HsImpExp where +import GhcPrelude + import Module ( ModuleName ) import HsDoc ( HsDocString ) import OccName ( HasOccName(..), isTcOcc, isSymOcc ) diff --git a/compiler/hsSyn/HsLit.hs b/compiler/hsSyn/HsLit.hs index 8995ed93b3..7f0864eccc 100644 --- a/compiler/hsSyn/HsLit.hs +++ b/compiler/hsSyn/HsLit.hs @@ -19,6 +19,8 @@ module HsLit where #include "HsVersions.h" +import GhcPrelude + import {-# SOURCE #-} HsExpr( HsExpr, pprExpr ) import BasicTypes ( IntegralLit(..),FractionalLit(..),negateIntegralLit, negateFractionalLit,SourceText(..),pprWithSourceText ) diff --git a/compiler/hsSyn/HsPat.hs b/compiler/hsSyn/HsPat.hs index 445086867d..e05d8bbf68 100644 --- a/compiler/hsSyn/HsPat.hs +++ b/compiler/hsSyn/HsPat.hs @@ -38,6 +38,8 @@ module HsPat ( pprParendLPat, pprConArgs ) where +import GhcPrelude + import {-# SOURCE #-} HsExpr (SyntaxExpr, LHsExpr, HsSplice, pprLExpr, pprSplice) -- friends: diff --git a/compiler/hsSyn/HsSyn.hs b/compiler/hsSyn/HsSyn.hs index 76afa8b81e..62bfa2e5c5 100644 --- a/compiler/hsSyn/HsSyn.hs +++ b/compiler/hsSyn/HsSyn.hs @@ -34,6 +34,8 @@ module HsSyn ( ) where -- friends: +import GhcPrelude + import HsDecls import HsBinds import HsExpr diff --git a/compiler/hsSyn/HsTypes.hs b/compiler/hsSyn/HsTypes.hs index 47d38353f8..b9cd9462f3 100644 --- a/compiler/hsSyn/HsTypes.hs +++ b/compiler/hsSyn/HsTypes.hs @@ -68,6 +68,8 @@ module HsTypes ( pprHsContext, pprHsContextNoArrow, pprHsContextMaybe ) where +import GhcPrelude + import {-# SOURCE #-} HsExpr ( HsSplice, pprSplice ) import PlaceHolder ( PlaceHolder(..) ) diff --git a/compiler/hsSyn/HsUtils.hs b/compiler/hsSyn/HsUtils.hs index a72e3c8469..8ba143e50e 100644 --- a/compiler/hsSyn/HsUtils.hs +++ b/compiler/hsSyn/HsUtils.hs @@ -92,6 +92,8 @@ module HsUtils( #include "HsVersions.h" +import GhcPrelude + import HsDecls import HsBinds import HsExpr diff --git a/compiler/hsSyn/PlaceHolder.hs b/compiler/hsSyn/PlaceHolder.hs index 5c716d259c..0b4711a364 100644 --- a/compiler/hsSyn/PlaceHolder.hs +++ b/compiler/hsSyn/PlaceHolder.hs @@ -6,6 +6,8 @@ module PlaceHolder where +import GhcPrelude () + import Type ( Type ) import Outputable import Name |