Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Synopsis
- newtype PosP (b :: BinP) = PosP {}
- data PosP' (n :: Nat) (b :: BinP) where
- top :: SBinPI b => PosP b
- pop :: (SBinPI a, Pred b ~ 'BP a, Succ a ~ b) => PosP a -> PosP b
- explicitShow :: PosP b -> String
- explicitShow' :: PosP' n b -> String
- explicitShowsPrec :: Int -> PosP b -> ShowS
- explicitShowsPrec' :: Int -> PosP' n b -> ShowS
- toNatural :: PosP b -> Natural
- toNatural' :: forall n b. SNatI n => PosP' n b -> Natural
- boring :: PosP 'BE
- weakenRight1 :: SBinPI b => PosP b -> PosP (Succ b)
- weakenRight1' :: forall b n. SBinP b -> PosP' n b -> PosP' n (Succ b)
- universe :: forall b. SBinPI b => [PosP b]
- universe' :: forall b n. (SNatI n, SBinPI b) => [PosP' n b]
Documentation
data PosP' (n :: Nat) (b :: BinP) where Source #
Instances
(SNatI n, SBinPI b) => Bounded (PosP' n b) Source # | |
Eq (PosP' n b) Source # | |
Ord (PosP' n b) Source # | |
Defined in Data.BinP.PosP | |
SNatI n => Show (PosP' n b) Source # | |
(SNatI n, SBinPI b) => Function (PosP' n b) Source # | |
(SNatI n, SBinPI b) => Arbitrary (PosP' n b) Source # | |
SNatI n => CoArbitrary (PosP' n b) Source # | |
Defined in Data.BinP.PosP coarbitrary :: PosP' n b -> Gen b0 -> Gen b0 # |
Top & Pop
Showing
explicitShow :: PosP b -> String Source #
explicitShow' :: PosP' n b -> String Source #