| Copyright | (C) 2013-2016 University of Twente 2016-2017 Myrtle Software Ltd 2017 QBayLogic Google Inc. | 
|---|---|
| License | BSD2 (see the file LICENSE) | 
| Maintainer | Christiaan Baaij <christiaan.baaij@gmail.com> | 
| Safe Haskell | None | 
| Language | Haskell2010 | 
Clash.Driver.Types
Description
Type definitions used by the Driver module
Synopsis
- data Binding = Binding {- bindingId :: Id
- bindingLoc :: SrcSpan
- bindingSpec :: InlineSpec
- bindingTerm :: Term
 
- type BindingMap = VarEnv Binding
- data DebugLevel
- data ClashOpts = ClashOpts {- opt_inlineLimit :: Int
- opt_specLimit :: Int
- opt_inlineFunctionLimit :: Word
- opt_inlineConstantLimit :: Word
- opt_dbgLevel :: DebugLevel
- opt_dbgTransformations :: Set String
- opt_dbgTransformationsFrom :: Int
- opt_dbgTransformationsLimit :: Int
- opt_cachehdl :: Bool
- opt_cleanhdl :: Bool
- opt_primWarn :: Bool
- opt_color :: OverridingBool
- opt_intWidth :: Int
- opt_hdlDir :: Maybe String
- opt_hdlSyn :: HdlSyn
- opt_errorExtra :: Bool
- opt_floatSupport :: Bool
- opt_importPaths :: [FilePath]
- opt_componentPrefix :: Maybe String
- opt_newInlineStrat :: Bool
- opt_escapedIds :: Bool
- opt_ultra :: Bool
- opt_forceUndefined :: Maybe (Maybe Int)
- opt_checkIDir :: Bool
- opt_aggressiveXOpt :: Bool
- opt_inlineWFCacheLimit :: Word
 
- defClashOpts :: ClashOpts
- data Manifest = Manifest {- manifestHash :: (Int, Maybe Int)
- successFlags :: (Int, Int, Bool)
- portInNames :: [Text]
- portInTypes :: [Text]
- portOutNames :: [Text]
- portOutTypes :: [Text]
- componentNames :: [Text]
 
Documentation
Constructors
| Binding | |
| Fields 
 | |
Instances
| Show Binding Source # | |
| Generic Binding Source # | |
| Binary Binding Source # | |
| NFData Binding Source # | |
| Defined in Clash.Driver.Types | |
| type Rep Binding Source # | |
| Defined in Clash.Driver.Types type Rep Binding = D1 ('MetaData "Binding" "Clash.Driver.Types" "clash-lib-1.2.2-inplace" 'False) (C1 ('MetaCons "Binding" 'PrefixI 'True) ((S1 ('MetaSel ('Just "bindingId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id) :*: S1 ('MetaSel ('Just "bindingLoc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SrcSpan)) :*: (S1 ('MetaSel ('Just "bindingSpec") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InlineSpec) :*: S1 ('MetaSel ('Just "bindingTerm") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Term)))) | |
type BindingMap = VarEnv Binding Source #
Global function binders
Global functions cannot be mutually recursive, only self-recursive.
data DebugLevel Source #
Debug Message Verbosity
Constructors
| DebugNone | Don't show debug messages | 
| DebugSilent | Run invariant checks and err if violated (enabled by any debug flag) | 
| DebugFinal | Show completely normalized expressions | 
| DebugName | Show names of applied transformations | 
| DebugTry | Show names of tried AND applied transformations | 
| DebugApplied | Show sub-expressions after a successful rewrite | 
| DebugAll | Show all sub-expressions on which a rewrite is attempted | 
Instances
Constructors
| ClashOpts | |
| Fields 
 | |
Information about the generated HDL between (sub)runs of the compiler
Constructors
| Manifest | |
| Fields 
 | |