clash-prelude-1.6.4: Clash: a functional hardware description language - Prelude library
Copyright© 2015-2016 Christiaan Baaij
2017 Google Inc.
2019 Myrtle Software Ltd
LicenseCreative Commons 4.0 (CC BY 4.0) (https://creativecommons.org/licenses/by/4.0/)
Safe HaskellNone
LanguageHaskell2010

Clash.Examples.Internal

Description

 

Documentation

upCounterLdT :: Num a => a -> (Bool, Bool, a) -> (a, a) Source #

lfsrGP :: (KnownNat (n + 1), Bits a) => Vec (n + 1) Bool -> Vec (n + 1) a -> Vec (n + 1) a Source #

crcT :: (Bits a, BitPack a) => a -> Bit -> a Source #

crc :: HiddenClockResetEnable dom => Signal dom Bool -> Signal dom Bool -> Signal dom Bit -> Signal dom (BitVector 16) Source #

data RxReg Source #

Instances

Instances details
Generic RxReg Source # 
Instance details

Defined in Clash.Examples.Internal

Associated Types

type Rep RxReg :: Type -> Type #

Methods

from :: RxReg -> Rep RxReg x #

to :: Rep RxReg x -> RxReg #

NFDataX RxReg Source # 
Instance details

Defined in Clash.Examples.Internal

type Rep RxReg Source # 
Instance details

Defined in Clash.Examples.Internal

data TxReg Source #

Constructors

TxReg 

Instances

Instances details
Generic TxReg Source # 
Instance details

Defined in Clash.Examples.Internal

Associated Types

type Rep TxReg :: Type -> Type #

Methods

from :: TxReg -> Rep TxReg x #

to :: Rep TxReg x -> TxReg #

NFDataX TxReg Source # 
Instance details

Defined in Clash.Examples.Internal

type Rep TxReg Source # 
Instance details

Defined in Clash.Examples.Internal

uart :: forall (dom :: Domain). (KnownDomain dom, ?clock :: Clock dom, ?enable :: Enable dom, ?reset :: Reset dom) => Signal dom Bool -> Signal dom (BitVector 8) -> Signal dom Bool -> Signal dom Bit -> Signal dom Bool -> Signal dom Bool -> (Signal dom Bit, Signal dom Bool, Signal dom (BitVector 8), Signal dom Bool) Source #