Copyright | (C) 2013-2016 University of Twente 2016-2017 Myrtle Software Ltd 2017 QBayLogic Google Inc. 2020 QBayLogic |
---|---|
License | BSD2 (see the file LICENSE) |
Maintainer | QBayLogic B.V. <devops@qbaylogic.com> |
Safe Haskell | None |
Language | Haskell2010 |
Type definitions used by the Driver module
Synopsis
- data IsPrim
- data Binding a = Binding {
- bindingId :: Id
- bindingLoc :: SrcSpan
- bindingSpec :: InlineSpec
- bindingIsPrim :: IsPrim
- bindingTerm :: a
- type BindingMap = VarEnv (Binding Term)
- data DebugLevel
- data ClashOpts = ClashOpts {
- opt_inlineLimit :: Int
- opt_specLimit :: Int
- opt_inlineFunctionLimit :: Word
- opt_inlineConstantLimit :: Word
- opt_evaluatorFuelLimit :: Word
- opt_dbgLevel :: DebugLevel
- opt_dbgTransformations :: Set String
- opt_dbgTransformationsFrom :: Int
- opt_dbgTransformationsLimit :: Int
- opt_dbgRewriteHistoryFile :: Maybe FilePath
- opt_cachehdl :: Bool
- opt_clear :: 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 Text
- opt_newInlineStrat :: Bool
- opt_escapedIds :: Bool
- opt_lowerCaseBasicIds :: PreserveCase
- opt_ultra :: Bool
- opt_forceUndefined :: Maybe (Maybe Int)
- opt_checkIDir :: Bool
- opt_aggressiveXOpt :: Bool
- opt_aggressiveXOptBB :: Bool
- opt_inlineWFCacheLimit :: Word
- opt_edalize :: Bool
- defClashOpts :: ClashOpts
- newtype SdcInfo = SdcInfo {}
- pprSDC :: SdcInfo -> Doc ()
Documentation
Binding | |
|
Instances
Functor Binding Source # | |
Show a => Show (Binding a) Source # | |
Generic (Binding a) Source # | |
Binary a => Binary (Binding a) Source # | |
NFData a => NFData (Binding a) Source # | |
Defined in Clash.Driver.Types | |
type Rep (Binding a) Source # | |
Defined in Clash.Driver.Types type Rep (Binding a) = D1 ('MetaData "Binding" "Clash.Driver.Types" "clash-lib-1.4.0-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 "bindingIsPrim") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IsPrim) :*: S1 ('MetaSel ('Just "bindingTerm") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))))) |
type BindingMap = VarEnv (Binding Term) Source #
Global function binders
Global functions cannot be mutually recursive, only self-recursive.
data DebugLevel Source #
Debug Message Verbosity
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
Options passed to Clash compiler
ClashOpts | |
|
Synopsys Design Constraint (SDC) information for a component. Currently this limited to the names and periods of clocks for create_clock.