clash-prelude-hedgehog-1.6.3: Hedgehog Generators for clash-prelude
Copyright(C) 2021-2022 QBayLogic B.V.
LicenseBSD2 (see the file LICENSE)
MaintainerQBayLogic B.V. <devops@qbaylogic.com>
Safe HaskellNone
LanguageHaskell2010

Clash.Hedgehog.Sized.RTree

Description

Random generation of RTree.

Documentation

genRTree :: (MonadGen m, KnownNat n) => m a -> m (RTree n a) Source #

genNonEmptyRTree :: (MonadGen m, KnownNat n, 1 <= n) => m a -> m (RTree n a) Source #

data SomeRTree atLeast a where Source #

Constructors

SomeRTree :: SNat n -> RTree (atLeast + n) a -> SomeRTree atLeast a 

Instances

Instances details
(KnownNat atLeast, Show a) => Show (SomeRTree atLeast a) Source # 
Instance details

Defined in Clash.Hedgehog.Sized.RTree

Methods

showsPrec :: Int -> SomeRTree atLeast a -> ShowS #

show :: SomeRTree atLeast a -> String #

showList :: [SomeRTree atLeast a] -> ShowS #

genSomeRTree :: (MonadGen m, KnownNat atLeast) => Range Natural -> m a -> m (SomeRTree atLeast a) Source #