Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
RetroClash.SerialRx
Documentation
serialRx :: forall n rate dom. (KnownNat n, KnownNat (ClockDivider dom (HzToPeriod rate)), HiddenClockResetEnable dom) => SNat rate -> Signal dom Bit -> Signal dom (Maybe (BitVector n)) Source #
serialRxDyn :: (KnownNat n, HiddenClockResetEnable dom) => Signal dom Word32 -> Signal dom Bit -> Signal dom (Maybe (BitVector n)) Source #
Instances
Generic (RxState n) Source # | |
KnownNat n => Show (RxState n) Source # | |
KnownNat n => NFDataX (RxState n) Source # | |
Defined in RetroClash.SerialRx Methods deepErrorX :: String -> RxState n # hasUndefined :: RxState n -> Bool # ensureSpine :: RxState n -> RxState n # | |
KnownNat n => Eq (RxState n) Source # | |
type Rep (RxState n) Source # | |
Defined in RetroClash.SerialRx type Rep (RxState n) = D1 ('MetaData "RxState" "RetroClash.SerialRx" "retroclash-lib-0.1.2.3-CyofdjsWDRF6p6fT5WYPf1" 'False) (C1 ('MetaCons "RxIdle" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RxBit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bit)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (RxBit n))))) |
Instances
Generic (RxBit n) Source # | |
KnownNat n => Show (RxBit n) Source # | |
KnownNat n => NFDataX (RxBit n) Source # | |
Defined in RetroClash.SerialRx Methods deepErrorX :: String -> RxBit n # hasUndefined :: RxBit n -> Bool # ensureSpine :: RxBit n -> RxBit n # | |
KnownNat n => Eq (RxBit n) Source # | |
type Rep (RxBit n) Source # | |
Defined in RetroClash.SerialRx type Rep (RxBit n) = D1 ('MetaData "RxBit" "RetroClash.SerialRx" "retroclash-lib-0.1.2.3-CyofdjsWDRF6p6fT5WYPf1" 'False) (C1 ('MetaCons "StartBit" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DataBit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BitVector n)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Index n))) :+: C1 ('MetaCons "StopBit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BitVector n))))) |