Safe Haskell | None |
---|---|
Language | Haskell2010 |
Data.Impossible
Documentation
data Impossible Source #
Constructors
Impossible |
Instances
Show Impossible Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> Impossible -> ShowS # show :: Impossible -> String # showList :: [Impossible] -> ShowS # |
imp :: HasCallStack => a Source #
impossible :: HasCallStack => a Source #
impossibleTo :: HasCallStack => String -> a Source #
data ImpossibleM1 t1 Source #
Constructors
ImpossibleM1 |
Instances
data ImpossibleM2 t1 t2 Source #
Constructors
ImpossibleM2 |
Instances
data ImpossibleM3 t1 t2 t3 Source #
Constructors
ImpossibleM3 |
Instances
Functor (ImpossibleM3 t1 t2 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM3 t1 t2 a -> ImpossibleM3 t1 t2 b # (<$) :: a -> ImpossibleM3 t1 t2 b -> ImpossibleM3 t1 t2 a # | |
Foldable (ImpossibleM3 t1 t2 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM3 t1 t2 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM3 t1 t2 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM3 t1 t2 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM3 t1 t2 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM3 t1 t2 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM3 t1 t2 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM3 t1 t2 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM3 t1 t2 a -> a # toList :: ImpossibleM3 t1 t2 a -> [a] # null :: ImpossibleM3 t1 t2 a -> Bool # length :: ImpossibleM3 t1 t2 a -> Int # elem :: Eq a => a -> ImpossibleM3 t1 t2 a -> Bool # maximum :: Ord a => ImpossibleM3 t1 t2 a -> a # minimum :: Ord a => ImpossibleM3 t1 t2 a -> a # sum :: Num a => ImpossibleM3 t1 t2 a -> a # product :: Num a => ImpossibleM3 t1 t2 a -> a # | |
Traversable (ImpossibleM3 t1 t2 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM3 t1 t2 a -> f (ImpossibleM3 t1 t2 b) # sequenceA :: Applicative f => ImpossibleM3 t1 t2 (f a) -> f (ImpossibleM3 t1 t2 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM3 t1 t2 a -> m (ImpossibleM3 t1 t2 b) # sequence :: Monad m => ImpossibleM3 t1 t2 (m a) -> m (ImpossibleM3 t1 t2 a) # | |
Show (ImpossibleM3 t1 t2 t3) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM3 t1 t2 t3 -> ShowS # show :: ImpossibleM3 t1 t2 t3 -> String # showList :: [ImpossibleM3 t1 t2 t3] -> ShowS # |
data ImpossibleM4 t1 t2 t3 t4 Source #
Constructors
ImpossibleM4 |
Instances
Functor (ImpossibleM4 t1 t2 t3 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM4 t1 t2 t3 a -> ImpossibleM4 t1 t2 t3 b # (<$) :: a -> ImpossibleM4 t1 t2 t3 b -> ImpossibleM4 t1 t2 t3 a # | |
Foldable (ImpossibleM4 t1 t2 t3 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM4 t1 t2 t3 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM4 t1 t2 t3 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM4 t1 t2 t3 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM4 t1 t2 t3 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM4 t1 t2 t3 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM4 t1 t2 t3 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM4 t1 t2 t3 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM4 t1 t2 t3 a -> a # toList :: ImpossibleM4 t1 t2 t3 a -> [a] # null :: ImpossibleM4 t1 t2 t3 a -> Bool # length :: ImpossibleM4 t1 t2 t3 a -> Int # elem :: Eq a => a -> ImpossibleM4 t1 t2 t3 a -> Bool # maximum :: Ord a => ImpossibleM4 t1 t2 t3 a -> a # minimum :: Ord a => ImpossibleM4 t1 t2 t3 a -> a # sum :: Num a => ImpossibleM4 t1 t2 t3 a -> a # product :: Num a => ImpossibleM4 t1 t2 t3 a -> a # | |
Traversable (ImpossibleM4 t1 t2 t3 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM4 t1 t2 t3 a -> f (ImpossibleM4 t1 t2 t3 b) # sequenceA :: Applicative f => ImpossibleM4 t1 t2 t3 (f a) -> f (ImpossibleM4 t1 t2 t3 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM4 t1 t2 t3 a -> m (ImpossibleM4 t1 t2 t3 b) # sequence :: Monad m => ImpossibleM4 t1 t2 t3 (m a) -> m (ImpossibleM4 t1 t2 t3 a) # | |
Show (ImpossibleM4 t1 t2 t3 t4) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM4 t1 t2 t3 t4 -> ShowS # show :: ImpossibleM4 t1 t2 t3 t4 -> String # showList :: [ImpossibleM4 t1 t2 t3 t4] -> ShowS # |
data ImpossibleM5 t1 t2 t3 t4 t5 Source #
Constructors
ImpossibleM5 |
Instances
Functor (ImpossibleM5 t1 t2 t3 t4 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM5 t1 t2 t3 t4 a -> ImpossibleM5 t1 t2 t3 t4 b # (<$) :: a -> ImpossibleM5 t1 t2 t3 t4 b -> ImpossibleM5 t1 t2 t3 t4 a # | |
Foldable (ImpossibleM5 t1 t2 t3 t4 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM5 t1 t2 t3 t4 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM5 t1 t2 t3 t4 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM5 t1 t2 t3 t4 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM5 t1 t2 t3 t4 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM5 t1 t2 t3 t4 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM5 t1 t2 t3 t4 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM5 t1 t2 t3 t4 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM5 t1 t2 t3 t4 a -> a # toList :: ImpossibleM5 t1 t2 t3 t4 a -> [a] # null :: ImpossibleM5 t1 t2 t3 t4 a -> Bool # length :: ImpossibleM5 t1 t2 t3 t4 a -> Int # elem :: Eq a => a -> ImpossibleM5 t1 t2 t3 t4 a -> Bool # maximum :: Ord a => ImpossibleM5 t1 t2 t3 t4 a -> a # minimum :: Ord a => ImpossibleM5 t1 t2 t3 t4 a -> a # sum :: Num a => ImpossibleM5 t1 t2 t3 t4 a -> a # product :: Num a => ImpossibleM5 t1 t2 t3 t4 a -> a # | |
Traversable (ImpossibleM5 t1 t2 t3 t4 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM5 t1 t2 t3 t4 a -> f (ImpossibleM5 t1 t2 t3 t4 b) # sequenceA :: Applicative f => ImpossibleM5 t1 t2 t3 t4 (f a) -> f (ImpossibleM5 t1 t2 t3 t4 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM5 t1 t2 t3 t4 a -> m (ImpossibleM5 t1 t2 t3 t4 b) # sequence :: Monad m => ImpossibleM5 t1 t2 t3 t4 (m a) -> m (ImpossibleM5 t1 t2 t3 t4 a) # | |
Show (ImpossibleM5 t1 t2 t3 t4 t5) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM5 t1 t2 t3 t4 t5 -> ShowS # show :: ImpossibleM5 t1 t2 t3 t4 t5 -> String # showList :: [ImpossibleM5 t1 t2 t3 t4 t5] -> ShowS # |
data ImpossibleM6 t1 t2 t3 t4 t5 t6 Source #
Constructors
ImpossibleM6 |
Instances
Functor (ImpossibleM6 t1 t2 t3 t4 t5 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM6 t1 t2 t3 t4 t5 a -> ImpossibleM6 t1 t2 t3 t4 t5 b # (<$) :: a -> ImpossibleM6 t1 t2 t3 t4 t5 b -> ImpossibleM6 t1 t2 t3 t4 t5 a # | |
Foldable (ImpossibleM6 t1 t2 t3 t4 t5 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM6 t1 t2 t3 t4 t5 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM6 t1 t2 t3 t4 t5 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM6 t1 t2 t3 t4 t5 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM6 t1 t2 t3 t4 t5 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM6 t1 t2 t3 t4 t5 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM6 t1 t2 t3 t4 t5 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM6 t1 t2 t3 t4 t5 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM6 t1 t2 t3 t4 t5 a -> a # toList :: ImpossibleM6 t1 t2 t3 t4 t5 a -> [a] # null :: ImpossibleM6 t1 t2 t3 t4 t5 a -> Bool # length :: ImpossibleM6 t1 t2 t3 t4 t5 a -> Int # elem :: Eq a => a -> ImpossibleM6 t1 t2 t3 t4 t5 a -> Bool # maximum :: Ord a => ImpossibleM6 t1 t2 t3 t4 t5 a -> a # minimum :: Ord a => ImpossibleM6 t1 t2 t3 t4 t5 a -> a # sum :: Num a => ImpossibleM6 t1 t2 t3 t4 t5 a -> a # product :: Num a => ImpossibleM6 t1 t2 t3 t4 t5 a -> a # | |
Traversable (ImpossibleM6 t1 t2 t3 t4 t5 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM6 t1 t2 t3 t4 t5 a -> f (ImpossibleM6 t1 t2 t3 t4 t5 b) # sequenceA :: Applicative f => ImpossibleM6 t1 t2 t3 t4 t5 (f a) -> f (ImpossibleM6 t1 t2 t3 t4 t5 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM6 t1 t2 t3 t4 t5 a -> m (ImpossibleM6 t1 t2 t3 t4 t5 b) # sequence :: Monad m => ImpossibleM6 t1 t2 t3 t4 t5 (m a) -> m (ImpossibleM6 t1 t2 t3 t4 t5 a) # | |
Show (ImpossibleM6 t1 t2 t3 t4 t5 t6) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM6 t1 t2 t3 t4 t5 t6 -> ShowS # show :: ImpossibleM6 t1 t2 t3 t4 t5 t6 -> String # showList :: [ImpossibleM6 t1 t2 t3 t4 t5 t6] -> ShowS # |
data ImpossibleM7 t1 t2 t3 t4 t5 t6 t7 Source #
Constructors
ImpossibleM7 |
Instances
Functor (ImpossibleM7 t1 t2 t3 t4 t5 t6 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> ImpossibleM7 t1 t2 t3 t4 t5 t6 b # (<$) :: a -> ImpossibleM7 t1 t2 t3 t4 t5 t6 b -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a # | |
Foldable (ImpossibleM7 t1 t2 t3 t4 t5 t6 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM7 t1 t2 t3 t4 t5 t6 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> a # toList :: ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> [a] # null :: ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> Bool # length :: ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> Int # elem :: Eq a => a -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> Bool # maximum :: Ord a => ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> a # minimum :: Ord a => ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> a # sum :: Num a => ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> a # product :: Num a => ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> a # | |
Traversable (ImpossibleM7 t1 t2 t3 t4 t5 t6 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> f (ImpossibleM7 t1 t2 t3 t4 t5 t6 b) # sequenceA :: Applicative f => ImpossibleM7 t1 t2 t3 t4 t5 t6 (f a) -> f (ImpossibleM7 t1 t2 t3 t4 t5 t6 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM7 t1 t2 t3 t4 t5 t6 a -> m (ImpossibleM7 t1 t2 t3 t4 t5 t6 b) # sequence :: Monad m => ImpossibleM7 t1 t2 t3 t4 t5 t6 (m a) -> m (ImpossibleM7 t1 t2 t3 t4 t5 t6 a) # | |
Show (ImpossibleM7 t1 t2 t3 t4 t5 t6 t7) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM7 t1 t2 t3 t4 t5 t6 t7 -> ShowS # show :: ImpossibleM7 t1 t2 t3 t4 t5 t6 t7 -> String # showList :: [ImpossibleM7 t1 t2 t3 t4 t5 t6 t7] -> ShowS # |
data ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 t8 Source #
Constructors
ImpossibleM8 |
Instances
Functor (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 b # (<$) :: a -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 b -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a # | |
Foldable (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> a # toList :: ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> [a] # null :: ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> Bool # length :: ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> Int # elem :: Eq a => a -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> Bool # maximum :: Ord a => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> a # minimum :: Ord a => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> a # sum :: Num a => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> a # product :: Num a => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> a # | |
Traversable (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> f (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 b) # sequenceA :: Applicative f => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 (f a) -> f (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a -> m (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 b) # sequence :: Monad m => ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 (m a) -> m (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 a) # | |
Show (ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 t8) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 t8 -> ShowS # show :: ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 t8 -> String # showList :: [ImpossibleM8 t1 t2 t3 t4 t5 t6 t7 t8] -> ShowS # |
data ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 t9 Source #
Constructors
ImpossibleM9 |
Instances
Functor (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fmap :: (a -> b) -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 b # (<$) :: a -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 b -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a # | |
Foldable (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods fold :: Monoid m => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 m -> m # foldMap :: Monoid m => (a -> m) -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> m # foldr :: (a -> b -> b) -> b -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> b # foldr' :: (a -> b -> b) -> b -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> b # foldl :: (b -> a -> b) -> b -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> b # foldl' :: (b -> a -> b) -> b -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> b # foldr1 :: (a -> a -> a) -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> a # foldl1 :: (a -> a -> a) -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> a # toList :: ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> [a] # null :: ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> Bool # length :: ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> Int # elem :: Eq a => a -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> Bool # maximum :: Ord a => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> a # minimum :: Ord a => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> a # sum :: Num a => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> a # product :: Num a => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> a # | |
Traversable (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 :: Type -> Type) Source # | |
Defined in Data.Impossible Methods traverse :: Applicative f => (a -> f b) -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> f (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 b) # sequenceA :: Applicative f => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 (f a) -> f (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a) # mapM :: Monad m => (a -> m b) -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a -> m (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 b) # sequence :: Monad m => ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 (m a) -> m (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 a) # | |
Show (ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 t9) Source # | |
Defined in Data.Impossible Methods showsPrec :: Int -> ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 t9 -> ShowS # show :: ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 t9 -> String # showList :: [ImpossibleM9 t1 t2 t3 t4 t5 t6 t7 t8 t9] -> ShowS # |
type Imp = Impossible Source #
type ImpM = ImpossibleM1 Source #
type ImpM1 = ImpossibleM1 Source #
type ImpM2 = ImpossibleM2 Source #
type ImpM3 = ImpossibleM3 Source #
type ImpM4 = ImpossibleM4 Source #
type ImpM5 = ImpossibleM5 Source #
type ImpM6 = ImpossibleM6 Source #
type ImpM7 = ImpossibleM7 Source #
type ImpM8 = ImpossibleM8 Source #
type ImpM9 = ImpossibleM9 Source #