ghc-8.0.0.20160111: The GHC API

Safe HaskellNone
LanguageHaskell2010

ByteCodeAsm

Description

ByteCodeLink: Bytecode assembler and linker

Synopsis

Documentation

bcoFreeNames :: UnlinkedBCO -> NameSet

Finds external references. Remember to remove the names defined by this group of BCOs themselves

data SizedSeq a :: TYPE Lifted -> TYPE Lifted Source

Instances

Functor SizedSeq 

Methods

fmap :: (a -> b) -> SizedSeq a -> SizedSeq b Source

(<$) :: a -> SizedSeq b -> SizedSeq a Source

Show a => Show (SizedSeq a) 
Generic (SizedSeq a) 

Associated Types

type Rep (SizedSeq a) :: * -> * Source

Methods

from :: SizedSeq a -> Rep (SizedSeq a) x Source

to :: Rep (SizedSeq a) x -> SizedSeq a Source

Binary a => Binary (SizedSeq a) 

Methods

put :: SizedSeq a -> Put Source

get :: Get (SizedSeq a) Source

type Rep (SizedSeq a) = D1 (MetaData "SizedSeq" "SizedSeq" "ghci-8.0.0.20160111" False) (C1 (MetaCons "SizedSeq" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Word)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [a])))) 

ssElts :: SizedSeq a -> [a] Source