clash-prelude-1.5.0: 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 (dom1 :: Symbol) (dom2 :: Symbol). (KnownDomain dom1, KnownDomain dom2, IP (AppendSymbol dom1 "_clk") (Clock dom1), IP (AppendSymbol dom1 "_rst") (Reset dom1), IP (AppendSymbol dom1 "_en") (Enable dom1), IP (AppendSymbol dom2 "_clk") (Clock dom2), IP (AppendSymbol dom2 "_rst") (Reset dom2), IP (AppendSymbol dom2 "_en") (Enable dom2)) => Signal dom1 Bool -> Signal dom1 (BitVector 8) -> Signal dom1 Bool -> Signal dom2 Bit -> Signal dom2 Bool -> Signal dom2 Bool -> (Signal dom1 Bit, Signal dom1 Bool, Signal dom2 (BitVector 8), Signal dom2 Bool) Source #