ghcide-2.4.0.0: The core of an IDE
Safe HaskellSafe-Inferred
LanguageHaskell2010

Development.IDE.GHC.Compat.Util

Description

GHC Utils and Datastructures re-exports.

Mainly handles module hierarchy re-organisation of GHC from version to= 9.0.

Some Functions, such as toList shadow other function-names. This way this module can be imported qualified more naturally.

Synopsis

Exception handling

class MonadThrow m => MonadCatch (m :: Type -> Type) #

Minimal complete definition

catch

Instances

Instances details
MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => STM a -> (e -> STM a) -> STM a

MonadCatch Ghc 
Instance details

Defined in GHC.Driver.Monad

Methods

catch :: (HasCallStack, Exception e) => Ghc a -> (e -> Ghc a) -> Ghc a

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => IO a -> (e -> IO a) -> IO a

MonadCatch Action 
Instance details

Defined in Development.IDE.Graph.Internal.Types

Methods

catch :: (HasCallStack, Exception e) => Action a -> (e -> Action a) -> Action a

e ~ SomeException => MonadCatch (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e0) => Either e a -> (e0 -> Either e a) -> Either e a

MonadCatch (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

catch :: (HasCallStack, Exception e) => IOEnv env a -> (e -> IOEnv env a) -> IOEnv env a

MonadCatch m => MonadCatch (GhcT m) 
Instance details

Defined in GHC.Driver.Monad

Methods

catch :: (HasCallStack, Exception e) => GhcT m a -> (e -> GhcT m a) -> GhcT m a

MonadCatch m => MonadCatch (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

catch :: (HasCallStack, Exception e) => ResourceT m a -> (e -> ResourceT m a) -> ResourceT m a

MonadCatch m => MonadCatch (MaybeT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a

(Functor f, MonadCatch m) => MonadCatch (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

catch :: (HasCallStack, Exception e) => FreeT f m a -> (e -> FreeT f m a) -> FreeT f m a

MonadCatch m => MonadCatch (LspT config m) 
Instance details

Defined in Language.LSP.Server.Core

Methods

catch :: (HasCallStack, Exception e) => LspT config m a -> (e -> LspT config m a) -> LspT config m a

MonadCatch m => MonadCatch (ExceptT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e0) => ExceptT e m a -> (e0 -> ExceptT e m a) -> ExceptT e m a

MonadCatch m => MonadCatch (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a

MonadCatch m => MonadCatch (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => StateT s m a -> (e -> StateT s m a) -> StateT s m a

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => StateT s m a -> (e -> StateT s m a) -> StateT s m a

(MonadCatch m, Monoid w) => MonadCatch (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => WriterT w m a -> (e -> WriterT w m a) -> WriterT w m a

(MonadCatch m, Monoid w) => MonadCatch (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => WriterT w m a -> (e -> WriterT w m a) -> WriterT w m a

(MonadCatch m, Monoid w) => MonadCatch (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => RWST r w s m a -> (e -> RWST r w s m a) -> RWST r w s m a

(MonadCatch m, Monoid w) => MonadCatch (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => RWST r w s m a -> (e -> RWST r w s m a) -> RWST r w s m a

data GhcException #

Instances

Instances details
Exception GhcException 
Instance details

Defined in GHC.Utils.Panic

Show GhcException 
Instance details

Defined in GHC.Utils.Panic

Methods

showsPrec :: Int -> GhcException -> ShowS #

show :: GhcException -> String #

showList :: [GhcException] -> ShowS #

handleGhcException :: ExceptionMonad m => (GhcException -> m a) -> m a -> m a #

catch :: (HasCallStack, MonadCatch m, Exception e) => m a -> (e -> m a) -> m a #

Same as upstream catch, but will not catch asynchronous exceptions

Since: safe-exceptions-0.1.0.0

try :: (HasCallStack, MonadCatch m, Exception e) => m a -> m (Either e a) #

Same as upstream try, but will not catch asynchronous exceptions

Since: safe-exceptions-0.1.0.0

Bags

data Bag a #

Instances

Instances details
Foldable Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fold :: Monoid m => Bag m -> m

foldMap :: Monoid m => (a -> m) -> Bag a -> m

foldMap' :: Monoid m => (a -> m) -> Bag a -> m

foldr :: (a -> b -> b) -> b -> Bag a -> b

foldr' :: (a -> b -> b) -> b -> Bag a -> b

foldl :: (b -> a -> b) -> b -> Bag a -> b

foldl' :: (b -> a -> b) -> b -> Bag a -> b

foldr1 :: (a -> a -> a) -> Bag a -> a

foldl1 :: (a -> a -> a) -> Bag a -> a

toList :: Bag a -> [a]

null :: Bag a -> Bool

length :: Bag a -> Int

elem :: Eq a => a -> Bag a -> Bool

maximum :: Ord a => Bag a -> a

minimum :: Ord a => Bag a -> a

sum :: Num a => Bag a -> a

product :: Num a => Bag a -> a

Traversable Bag 
Instance details

Defined in GHC.Data.Bag

Methods

traverse :: Applicative f => (a -> f b) -> Bag a -> f (Bag b) #

sequenceA :: Applicative f => Bag (f a) -> f (Bag a)

mapM :: Monad m => (a -> m b) -> Bag a -> m (Bag b) #

sequence :: Monad m => Bag (m a) -> m (Bag a) #

Functor Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fmap :: (a -> b) -> Bag a -> Bag b #

(<$) :: a -> Bag b -> Bag a #

Data a => Data (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bag a -> c (Bag a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Bag a)

toConstr :: Bag a -> Constr

dataTypeOf :: Bag a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Bag a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Bag a))

gmapT :: (forall b. Data b => b -> b) -> Bag a -> Bag a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bag a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bag a -> r

gmapQ :: (forall d. Data d => d -> u) -> Bag a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bag a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a)

Monoid (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

mempty :: Bag a #

mappend :: Bag a -> Bag a -> Bag a #

mconcat :: [Bag a] -> Bag a #

Semigroup (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

(<>) :: Bag a -> Bag a -> Bag a #

sconcat :: NonEmpty (Bag a) -> Bag a #

stimes :: Integral b => b -> Bag a -> Bag a #

IsList (Bag a) 
Instance details

Defined in GHC.Data.Bag

Associated Types

type Item (Bag a)

Methods

fromList :: [Item (Bag a)] -> Bag a

fromListN :: Int -> [Item (Bag a)] -> Bag a

toList :: Bag a -> [Item (Bag a)]

Show a => Show (Bag a) # 
Instance details

Defined in Development.IDE.GHC.Orphans

Methods

showsPrec :: Int -> Bag a -> ShowS #

show :: Bag a -> String #

showList :: [Bag a] -> ShowS #

ToHie a => ToHie (Bag a) 
Instance details

Defined in GHC.Iface.Ext.Ast

Methods

toHie :: Bag a -> HieM [HieAST Type]

Outputable a => Outputable (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

ppr :: Bag a -> SDoc #

type Item (Bag a) 
Instance details

Defined in GHC.Data.Bag

type Item (Bag a) = a

bagToList :: Bag a -> [a] #

listToBag :: [a] -> Bag a #

unionBags :: Bag a -> Bag a -> Bag a #

isEmptyBag :: Bag a -> Bool #

Boolean Formula

type LBooleanFormula a = LocatedL (BooleanFormula a) #

data BooleanFormula a #

Instances

Instances details
Foldable BooleanFormula 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

fold :: Monoid m => BooleanFormula m -> m

foldMap :: Monoid m => (a -> m) -> BooleanFormula a -> m

foldMap' :: Monoid m => (a -> m) -> BooleanFormula a -> m

foldr :: (a -> b -> b) -> b -> BooleanFormula a -> b

foldr' :: (a -> b -> b) -> b -> BooleanFormula a -> b

foldl :: (b -> a -> b) -> b -> BooleanFormula a -> b

foldl' :: (b -> a -> b) -> b -> BooleanFormula a -> b

foldr1 :: (a -> a -> a) -> BooleanFormula a -> a

foldl1 :: (a -> a -> a) -> BooleanFormula a -> a

toList :: BooleanFormula a -> [a]

null :: BooleanFormula a -> Bool

length :: BooleanFormula a -> Int

elem :: Eq a => a -> BooleanFormula a -> Bool

maximum :: Ord a => BooleanFormula a -> a

minimum :: Ord a => BooleanFormula a -> a

sum :: Num a => BooleanFormula a -> a

product :: Num a => BooleanFormula a -> a

Traversable BooleanFormula 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

traverse :: Applicative f => (a -> f b) -> BooleanFormula a -> f (BooleanFormula b) #

sequenceA :: Applicative f => BooleanFormula (f a) -> f (BooleanFormula a)

mapM :: Monad m => (a -> m b) -> BooleanFormula a -> m (BooleanFormula b) #

sequence :: Monad m => BooleanFormula (m a) -> m (BooleanFormula a) #

Functor BooleanFormula 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

fmap :: (a -> b) -> BooleanFormula a -> BooleanFormula b #

(<$) :: a -> BooleanFormula b -> BooleanFormula a #

Data a => Data (BooleanFormula a) 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BooleanFormula a -> c (BooleanFormula a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BooleanFormula a)

toConstr :: BooleanFormula a -> Constr

dataTypeOf :: BooleanFormula a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (BooleanFormula a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BooleanFormula a))

gmapT :: (forall b. Data b => b -> b) -> BooleanFormula a -> BooleanFormula a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BooleanFormula a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BooleanFormula a -> r

gmapQ :: (forall d. Data d => d -> u) -> BooleanFormula a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> BooleanFormula a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BooleanFormula a -> m (BooleanFormula a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BooleanFormula a -> m (BooleanFormula a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BooleanFormula a -> m (BooleanFormula a)

ToHie (LBooleanFormula (LocatedN Name)) 
Instance details

Defined in GHC.Iface.Ext.Ast

Methods

toHie :: LBooleanFormula (LocatedN Name) -> HieM [HieAST Type]

Binary a => Binary (BooleanFormula a) 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

put_ :: BinHandle -> BooleanFormula a -> IO ()

put :: BinHandle -> BooleanFormula a -> IO (Bin (BooleanFormula a))

get :: BinHandle -> IO (BooleanFormula a)

OutputableBndr a => Outputable (BooleanFormula a) 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

ppr :: BooleanFormula a -> SDoc #

Eq a => Eq (BooleanFormula a) 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

(==) :: BooleanFormula a -> BooleanFormula a -> Bool #

(/=) :: BooleanFormula a -> BooleanFormula a -> Bool #

OverridingBool

data OverridingBool #

Constructors

Auto 
Never 
Always 

Instances

Instances details
Bounded OverridingBool 
Instance details

Defined in GHC.Data.Bool

Enum OverridingBool 
Instance details

Defined in GHC.Data.Bool

Read OverridingBool 
Instance details

Defined in GHC.Data.Bool

Show OverridingBool 
Instance details

Defined in GHC.Data.Bool

Methods

showsPrec :: Int -> OverridingBool -> ShowS #

show :: OverridingBool -> String #

showList :: [OverridingBool] -> ShowS #

Eq OverridingBool 
Instance details

Defined in GHC.Data.Bool

Ord OverridingBool 
Instance details

Defined in GHC.Data.Bool

Maybes

data MaybeErr err val #

Constructors

Succeeded val 
Failed err 

Instances

Instances details
Applicative (MaybeErr err) 
Instance details

Defined in GHC.Data.Maybe

Methods

pure :: a -> MaybeErr err a #

(<*>) :: MaybeErr err (a -> b) -> MaybeErr err a -> MaybeErr err b #

liftA2 :: (a -> b -> c) -> MaybeErr err a -> MaybeErr err b -> MaybeErr err c #

(*>) :: MaybeErr err a -> MaybeErr err b -> MaybeErr err b #

(<*) :: MaybeErr err a -> MaybeErr err b -> MaybeErr err a #

Functor (MaybeErr err) 
Instance details

Defined in GHC.Data.Maybe

Methods

fmap :: (a -> b) -> MaybeErr err a -> MaybeErr err b #

(<$) :: a -> MaybeErr err b -> MaybeErr err a #

Monad (MaybeErr err) 
Instance details

Defined in GHC.Data.Maybe

Methods

(>>=) :: MaybeErr err a -> (a -> MaybeErr err b) -> MaybeErr err b #

(>>) :: MaybeErr err a -> MaybeErr err b -> MaybeErr err b #

return :: a -> MaybeErr err a #

orElse :: Maybe a -> a -> a #

Pair

data Pair a #

Constructors

Pair 

Fields

Instances

Instances details
Foldable Pair 
Instance details

Defined in GHC.Data.Pair

Methods

fold :: Monoid m => Pair m -> m

foldMap :: Monoid m => (a -> m) -> Pair a -> m

foldMap' :: Monoid m => (a -> m) -> Pair a -> m

foldr :: (a -> b -> b) -> b -> Pair a -> b

foldr' :: (a -> b -> b) -> b -> Pair a -> b

foldl :: (b -> a -> b) -> b -> Pair a -> b

foldl' :: (b -> a -> b) -> b -> Pair a -> b

foldr1 :: (a -> a -> a) -> Pair a -> a

foldl1 :: (a -> a -> a) -> Pair a -> a

toList :: Pair a -> [a]

null :: Pair a -> Bool

length :: Pair a -> Int

elem :: Eq a => a -> Pair a -> Bool

maximum :: Ord a => Pair a -> a

minimum :: Ord a => Pair a -> a

sum :: Num a => Pair a -> a

product :: Num a => Pair a -> a

Traversable Pair 
Instance details

Defined in GHC.Data.Pair

Methods

traverse :: Applicative f => (a -> f b) -> Pair a -> f (Pair b) #

sequenceA :: Applicative f => Pair (f a) -> f (Pair a)

mapM :: Monad m => (a -> m b) -> Pair a -> m (Pair b) #

sequence :: Monad m => Pair (m a) -> m (Pair a) #

Applicative Pair 
Instance details

Defined in GHC.Data.Pair

Methods

pure :: a -> Pair a #

(<*>) :: Pair (a -> b) -> Pair a -> Pair b #

liftA2 :: (a -> b -> c) -> Pair a -> Pair b -> Pair c #

(*>) :: Pair a -> Pair b -> Pair b #

(<*) :: Pair a -> Pair b -> Pair a #

Functor Pair 
Instance details

Defined in GHC.Data.Pair

Methods

fmap :: (a -> b) -> Pair a -> Pair b #

(<$) :: a -> Pair b -> Pair a #

(Semigroup a, Monoid a) => Monoid (Pair a) 
Instance details

Defined in GHC.Data.Pair

Methods

mempty :: Pair a #

mappend :: Pair a -> Pair a -> Pair a #

mconcat :: [Pair a] -> Pair a #

Semigroup a => Semigroup (Pair a) 
Instance details

Defined in GHC.Data.Pair

Methods

(<>) :: Pair a -> Pair a -> Pair a #

sconcat :: NonEmpty (Pair a) -> Pair a #

stimes :: Integral b => b -> Pair a -> Pair a #

Outputable a => Outputable (Pair a) 
Instance details

Defined in GHC.Data.Pair

Methods

ppr :: Pair a -> SDoc #

EnumSet

data EnumSet a #

Instances

Instances details
Monoid (EnumSet a) 
Instance details

Defined in GHC.Data.EnumSet

Methods

mempty :: EnumSet a #

mappend :: EnumSet a -> EnumSet a -> EnumSet a #

mconcat :: [EnumSet a] -> EnumSet a #

Semigroup (EnumSet a) 
Instance details

Defined in GHC.Data.EnumSet

Methods

(<>) :: EnumSet a -> EnumSet a -> EnumSet a #

sconcat :: NonEmpty (EnumSet a) -> EnumSet a #

stimes :: Integral b => b -> EnumSet a -> EnumSet a #

NFData (EnumSet a) 
Instance details

Defined in GHC.Data.EnumSet

Methods

rnf :: EnumSet a -> () #

Binary (EnumSet a) 
Instance details

Defined in GHC.Data.EnumSet

Methods

put_ :: BinHandle -> EnumSet a -> IO ()

put :: BinHandle -> EnumSet a -> IO (Bin (EnumSet a))

get :: BinHandle -> IO (EnumSet a)

toList :: Enum a => EnumSet a -> [a] #

FastString exports

data FastString #

Instances

Instances details
Data FastString 
Instance details

Defined in GHC.Data.FastString

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FastString -> c FastString

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FastString

toConstr :: FastString -> Constr

dataTypeOf :: FastString -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FastString)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FastString)

gmapT :: (forall b. Data b => b -> b) -> FastString -> FastString

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FastString -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FastString -> r

gmapQ :: (forall d. Data d => d -> u) -> FastString -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> FastString -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FastString -> m FastString

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FastString -> m FastString

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FastString -> m FastString

IsString FastString 
Instance details

Defined in GHC.Data.FastString

Monoid FastString 
Instance details

Defined in GHC.Data.FastString

Semigroup FastString 
Instance details

Defined in GHC.Data.FastString

Show FastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> FastString -> ShowS #

show :: FastString -> String #

showList :: [FastString] -> ShowS #

NFData FastString 
Instance details

Defined in GHC.Data.FastString

Methods

rnf :: FastString -> () #

ToJExpr FastString 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: FastString -> JExpr

toJExprFromList :: [FastString] -> JExpr

Uniquable FastString 
Instance details

Defined in GHC.Types.Unique

Binary FastString 
Instance details

Defined in GHC.Utils.Binary

Methods

put_ :: BinHandle -> FastString -> IO ()

put :: BinHandle -> FastString -> IO (Bin FastString)

get :: BinHandle -> IO FastString

Outputable FastString 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: FastString -> SDoc #

Eq FastString 
Instance details

Defined in GHC.Data.FastString

Methods

(==) :: FastString -> FastString -> Bool #

(/=) :: FastString -> FastString -> Bool #

Ord FastString 
Instance details

Defined in Development.IDE.GHC.Orphans

ToJExpr a => ToJExpr (UniqMap FastString a) 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: UniqMap FastString a -> JExpr

toJExprFromList :: [UniqMap FastString a] -> JExpr

type Anno FastString 
Instance details

Defined in GHC.Hs.Expr

type Anno FastString = SrcAnn NoEpAnns
type Anno (SourceText, RuleName) 
Instance details

Defined in GHC.Hs.Decls

type Anno (SourceText, RuleName) = SrcAnn NoEpAnns

newtype LexicalFastString #

Instances

Instances details
Data LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LexicalFastString -> c LexicalFastString

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LexicalFastString

toConstr :: LexicalFastString -> Constr

dataTypeOf :: LexicalFastString -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LexicalFastString)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LexicalFastString)

gmapT :: (forall b. Data b => b -> b) -> LexicalFastString -> LexicalFastString

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LexicalFastString -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LexicalFastString -> r

gmapQ :: (forall d. Data d => d -> u) -> LexicalFastString -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> LexicalFastString -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LexicalFastString -> m LexicalFastString

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LexicalFastString -> m LexicalFastString

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LexicalFastString -> m LexicalFastString

Show LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Binary LexicalFastString 
Instance details

Defined in GHC.Utils.Binary

Methods

put_ :: BinHandle -> LexicalFastString -> IO ()

put :: BinHandle -> LexicalFastString -> IO (Bin LexicalFastString)

get :: BinHandle -> IO LexicalFastString

Outputable LexicalFastString 
Instance details

Defined in GHC.Utils.Outputable

Eq LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Ord LexicalFastString 
Instance details

Defined in GHC.Data.FastString

uniq :: FastString -> Int #

Fingerprint

data Fingerprint #

Constructors

Fingerprint !Word64 !Word64 

Instances

Instances details
Storable Fingerprint 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Fingerprint -> Int #

alignment :: Fingerprint -> Int #

peekElemOff :: Ptr Fingerprint -> Int -> IO Fingerprint #

pokeElemOff :: Ptr Fingerprint -> Int -> Fingerprint -> IO () #

peekByteOff :: Ptr b -> Int -> IO Fingerprint #

pokeByteOff :: Ptr b -> Int -> Fingerprint -> IO () #

peek :: Ptr Fingerprint -> IO Fingerprint #

poke :: Ptr Fingerprint -> Fingerprint -> IO () #

Generic Fingerprint 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fingerprint :: Type -> Type

Methods

from :: Fingerprint -> Rep Fingerprint x

to :: Rep Fingerprint x -> Fingerprint

Show Fingerprint 
Instance details

Defined in GHC.Fingerprint.Type

Methods

showsPrec :: Int -> Fingerprint -> ShowS #

show :: Fingerprint -> String #

showList :: [Fingerprint] -> ShowS #

Binary Fingerprint 
Instance details

Defined in Data.Binary.Class

Methods

put :: Fingerprint -> Put

get :: Get Fingerprint

putList :: [Fingerprint] -> Put

NFData Fingerprint 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

Binary Fingerprint 
Instance details

Defined in GHC.Utils.Binary

Methods

put_ :: BinHandle -> Fingerprint -> IO ()

put :: BinHandle -> Fingerprint -> IO (Bin Fingerprint)

get :: BinHandle -> IO Fingerprint

Outputable Fingerprint 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Fingerprint -> SDoc #

Eq Fingerprint 
Instance details

Defined in GHC.Fingerprint.Type

Methods

(==) :: Fingerprint -> Fingerprint -> Bool #

(/=) :: Fingerprint -> Fingerprint -> Bool #

Ord Fingerprint 
Instance details

Defined in GHC.Fingerprint.Type

Hashable Fingerprint

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fingerprint -> Int #

hash :: Fingerprint -> Int #

type Rep Fingerprint 
Instance details

Defined in GHC.Generics

type Rep Fingerprint = D1 ('MetaData "Fingerprint" "GHC.Fingerprint.Type" "base" 'False) (C1 ('MetaCons "Fingerprint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64)))

getFileHash :: FilePath -> IO Fingerprint #

Unique

class Uniquable a #

Minimal complete definition

getUnique

Instances

Instances details
Uniquable Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

getUnique :: Label -> Unique #

Uniquable Class 
Instance details

Defined in GHC.Core.Class

Methods

getUnique :: Class -> Unique #

Uniquable CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

getUnique :: CoAxiomRule -> Unique #

Uniquable ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

getUnique :: ConLike -> Unique #

Uniquable DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

getUnique :: DataCon -> Unique #

Uniquable PatSyn 
Instance details

Defined in GHC.Core.PatSyn

Methods

getUnique :: PatSyn -> Unique #

Uniquable CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Uniquable TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

getUnique :: TyCon -> Unique #

Uniquable FastString 
Instance details

Defined in GHC.Types.Unique

Uniquable Ident 
Instance details

Defined in GHC.JS.Syntax

Methods

getUnique :: Ident -> Unique #

Uniquable EvBindsVar 
Instance details

Defined in GHC.Tc.Types.Evidence

Uniquable SkolemInfo 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

getUnique :: SkolemInfo -> Unique #

Uniquable Name 
Instance details

Defined in GHC.Types.Name

Methods

getUnique :: Name -> Unique #

Uniquable OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

getUnique :: OccName -> Unique #

Uniquable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

getUnique :: Unique -> Unique #

Uniquable Var 
Instance details

Defined in GHC.Types.Var

Methods

getUnique :: Var -> Unique #

Uniquable PackageId 
Instance details

Defined in GHC.Unit.Info

Methods

getUnique :: PackageId -> Unique #

Uniquable PackageName 
Instance details

Defined in GHC.Unit.Info

Uniquable Module 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Module -> Unique #

Uniquable UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: UnitId -> Unique #

Uniquable ModuleName 
Instance details

Defined in GHC.Types.Unique

Uniquable Int 
Instance details

Defined in GHC.Types.Unique

Methods

getUnique :: Int -> Unique #

Uniquable (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

getUnique :: CoAxiom br -> Unique #

Uniquable unit => Uniquable (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Definite unit -> Unique #

IsUnitId u => Uniquable (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: GenUnit u -> Unique #

nonDetCmpUnique :: Unique -> Unique -> Ordering #

data Unique #

Instances

Instances details
Show Unique 
Instance details

Defined in GHC.Types.Unique

Methods

showsPrec :: Int -> Unique -> ShowS #

show :: Unique -> String #

showList :: [Unique] -> ShowS #

Uniquable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

getUnique :: Unique -> Unique #

Outputable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

ppr :: Unique -> SDoc #

Eq Unique 
Instance details

Defined in GHC.Types.Unique

Methods

(==) :: Unique -> Unique -> Bool #

(/=) :: Unique -> Unique -> Bool #

mkUnique :: Char -> Int -> Unique #

newTagUnique :: Unique -> Char -> Unique #

UniqDFM

emptyUDFM :: UniqDFM key elt #

plusUDFM :: UniqDFM key elt -> UniqDFM key elt -> UniqDFM key elt #

plusUDFM_C :: (elt -> elt -> elt) -> UniqDFM key elt -> UniqDFM key elt -> UniqDFM key elt #

String Buffer

data StringBuffer #

Constructors

StringBuffer 

Fields

Instances

Instances details
Show StringBuffer 
Instance details

Defined in GHC.Data.StringBuffer

Methods

showsPrec :: Int -> StringBuffer -> ShowS #

show :: StringBuffer -> String #

showList :: [StringBuffer] -> ShowS #

NFData StringBuffer # 
Instance details

Defined in Development.IDE.GHC.Orphans

Methods

rnf :: StringBuffer -> () #

hGetStringBuffer :: FilePath -> IO StringBuffer #

atEnd :: StringBuffer -> Bool #