Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
withResetEnableGen :: KnownDomain dom => (HiddenClockResetEnable dom => r) -> Clock dom -> r Source #
withEnableGen :: KnownDomain dom => (HiddenClockResetEnable dom => r) -> Clock dom -> Reset dom -> r Source #
data Active (p :: Polarity) Source #
Instances
Eq (Active p) Source # | |
Ord (Active p) Source # | |
Defined in RetroClash.Utils | |
Show (Active p) Source # | |
Generic (Active p) Source # | |
BitPack (Active p) Source # | |
NFDataX (Active p) Source # | |
Defined in RetroClash.Utils deepErrorX :: String -> Active p # hasUndefined :: Active p -> Bool # ensureSpine :: Active p -> Active p # | |
type Rep (Active p) Source # | |
Defined in RetroClash.Utils | |
type BitSize (Active p) Source # | |
Defined in RetroClash.Utils |
halfIndex :: (KnownNat n, 1 <= (2 * n), CLog 2 (2 * n) ~ (CLog 2 n + 1)) => Index (2 * n) -> Index n Source #
changed :: (HiddenClockResetEnable dom, Eq a, NFDataX a) => a -> Signal dom a -> Signal dom Bool Source #
integrate :: (Monoid a, NFDataX a, HiddenClockResetEnable dom) => Signal dom Bool -> Signal dom a -> Signal dom a Source #
debounce :: forall ps a dom. (Eq a, NFDataX a, HiddenClockResetEnable dom, KnownNat (ClockDivider dom ps)) => SNat ps -> a -> Signal dom a -> Signal dom a Source #
riseEveryWhen :: forall n dom. (HiddenClockResetEnable dom, KnownNat n) => SNat n -> Signal dom Bool -> Signal dom Bool Source #
oscillateWhen :: HiddenClockResetEnable dom => Bool -> Signal dom Bool -> Signal dom Bool Source #
roundRobin :: forall n dom a. (KnownNat n, HiddenClockResetEnable dom) => Signal dom Bool -> (Signal dom (Vec n Bool), Signal dom (Index n)) Source #
countFromTo :: (Eq a, Enum a, NFDataX a, HiddenClockResetEnable dom) => a -> a -> Signal dom Bool -> Signal dom a Source #
mealyState :: (HiddenClockResetEnable dom, NFDataX s) => (i -> State s o) -> s -> Signal dom i -> Signal dom o Source #
mealyStateB :: (HiddenClockResetEnable dom, NFDataX s, Bundle i, Bundle o) => (i -> State s o) -> s -> Unbundled dom i -> Unbundled dom o Source #
mooreState :: (HiddenClockResetEnable dom, NFDataX s) => (i -> State s ()) -> (s -> o) -> s -> Signal dom i -> Signal dom o Source #
mooreStateB :: (HiddenClockResetEnable dom, NFDataX s, Bundle i, Bundle o) => (i -> State s ()) -> (s -> o) -> s -> Unbundled dom i -> Unbundled dom o Source #
guardA :: (Applicative f, Alternative m) => f Bool -> f (m a) -> f (m a) Source #
muxA :: (Foldable t, Alternative m, Applicative f) => t (f (m a)) -> f (m a) Source #
(.<|>.) :: (Applicative f, Alternative m) => f (m a) -> f (m a) -> f (m a) infixl 3 Source #
(.|>.) :: Applicative f => f a -> f (Maybe a) -> f a infix 2 Source #
(|>.) :: Applicative f => a -> f (Maybe a) -> f a infix 2 Source #
(.<|.) :: Applicative f => f (Maybe a) -> f a -> f a infix 2 Source #
(.<|) :: Applicative f => f (Maybe a) -> a -> f a infix 2 Source #
muxMaybe :: Applicative f => f a -> f (Maybe a) -> f a Source #
singlePort :: Applicative f => (f addr -> f (Maybe (addr, wr)) -> r) -> f addr -> f (Maybe wr) -> r Source #
unbraid :: (KnownNat n, KnownNat k, 1 <= n, 1 <= (n * (2 ^ k)), CLog 2 (2 ^ k) ~ k, CLog 2 (n * (2 ^ k)) ~ (CLog 2 n + k)) => Maybe (Index (n * (2 ^ k))) -> Vec (2 ^ k) (Maybe (Index n)) Source #