Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data TyEqSing :: a -> b -> Exp Bool Source #
Similar to TyEq
, but compares types via DefaultEq
used in singletons
comparisons (see Data.Singletons.Prelude.Eq module).
data ApplyConstraints :: [a -> Constraint] -> a -> Exp Constraint Source #
Instances
type Eval (ApplyConstraints (c ': cs) a2 :: Constraint -> Type) Source # | |
Defined in Util.Fcf type Eval (ApplyConstraints (c ': cs) a2 :: Constraint -> Type) = (c a2, Eval (ApplyConstraints cs a2)) | |
type Eval (ApplyConstraints ('[] :: [a -> Constraint]) _1 :: Constraint -> Type) Source # | |
Defined in Util.Fcf |
type family Eval (e :: Exp a) :: a #
Expression evaluator.
Instances
type Eval (Not 'False) | |
Defined in Fcf.Data.Bool | |
type Eval (Not 'True) | |
Defined in Fcf.Data.Bool | |
type Eval (Constraints (a ': as) :: Constraint -> Type) | |
Defined in Fcf.Utils | |
type Eval (Constraints ('[] :: [Constraint])) | |
Defined in Fcf.Utils | |
type Eval (MEmpty_ :: a -> Type) | |
Defined in Fcf.Class.Monoid | |
type Eval (Null (a2 ': as) :: Bool -> Type) | |
type Eval (Null ('[] :: [a]) :: Bool -> Type) | |
type Eval (And lst :: Bool -> Type) | |
type Eval (Or lst :: Bool -> Type) | |
type Eval (a <= b :: Bool -> Type) | |
type Eval (a >= b :: Bool -> Type) | |
type Eval (a < b :: Bool -> Type) | |
type Eval (a > b :: Bool -> Type) | |
type Eval (IsNothing ('Nothing :: Maybe a) :: Bool -> Type) | |
type Eval (IsNothing ('Just _a) :: Bool -> Type) | |
type Eval (IsJust ('Nothing :: Maybe a) :: Bool -> Type) | |
type Eval (IsJust ('Just _a) :: Bool -> Type) | |
type Eval ('False || b :: Bool -> Type) | |
type Eval ('True || b :: Bool -> Type) | |
type Eval (a || 'False :: Bool -> Type) | |
type Eval (a || 'True :: Bool -> Type) | |
type Eval ('False && b :: Bool -> Type) | |
type Eval ('True && b :: Bool -> Type) | |
type Eval (a && 'True :: Bool -> Type) | |
type Eval (a && 'False :: Bool -> Type) | |
type Eval (Length (a2 ': as) :: Nat -> Type) | |
type Eval (Length ('[] :: [a]) :: Nat -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Sum ns :: Nat -> Type) | |
type Eval (a + b :: Nat -> Type) | |
type Eval (a - b :: Nat -> Type) | |
type Eval (a * b :: Nat -> Type) | |
type Eval (a ^ b :: Nat -> Type) | |
type Eval (Error msg :: a -> Type) | |
type Eval (TError msg :: a -> Type) | |
type Eval (Pure x :: a -> Type) | |
Defined in Fcf.Combinators | |
type Eval (Join e :: a -> Type) | |
type Eval (IsPrefixOf xs ys :: Bool -> Type) | |
Defined in Fcf.Data.List | |
type Eval (IsSuffixOf xs ys :: Bool -> Type) | |
Defined in Fcf.Data.List | |
type Eval (IsInfixOf xs ys :: Bool -> Type) | |
type Eval (Elem a2 as :: Bool -> Type) | |
type Eval (IsLeft ('Right _a :: Either a b) :: Bool -> Type) | |
type Eval (IsLeft ('Left _a :: Either a b) :: Bool -> Type) | |
type Eval (IsRight ('Right _a :: Either a b) :: Bool -> Type) | |
type Eval (IsRight ('Left _a :: Either a b) :: Bool -> Type) | |
type Eval (ApplyConstraints (c ': cs) a2 :: Constraint -> Type) Source # | |
Defined in Util.Fcf type Eval (ApplyConstraints (c ': cs) a2 :: Constraint -> Type) = (c a2, Eval (ApplyConstraints cs a2)) | |
type Eval (ApplyConstraints ('[] :: [a -> Constraint]) _1 :: Constraint -> Type) Source # | |
Defined in Util.Fcf | |
type Eval (Fst '(a2, _b) :: a1 -> Type) | |
Defined in Fcf.Data.Common | |
type Eval (Snd '(_a, b) :: a2 -> Type) | |
Defined in Fcf.Data.Common | |
type Eval (FromMaybe _a ('Just b) :: a -> Type) | |
Defined in Fcf.Data.Common | |
type Eval (FromMaybe a2 ('Nothing :: Maybe a1) :: a1 -> Type) | |
type Eval (x .<> y :: a -> Type) | |
Defined in Fcf.Class.Monoid | |
type Eval (Concat xs :: a -> Type) | |
type Eval (TyEq a b :: Bool -> Type) | |
type Eval (All p lst :: Bool -> Type) | |
type Eval (Any p lst :: Bool -> Type) | |
type Eval (TyEqSing a b :: Bool -> Type) Source # | |
type Eval (Case ms a :: k -> Type) | |
type Eval (x & f :: a2 -> Type) | |
Defined in Fcf.Data.Function | |
type Eval (UnBool fal tru 'True :: a -> Type) | |
type Eval (UnBool fal tru 'False :: a -> Type) | |
type Eval (Pure1 f x :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (k =<< e :: a2 -> Type) | |
type Eval (e >>= k :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (f <$> e :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (f <*> e :: a2 -> Type) | |
type Eval (ConstFn a2 _b :: a1 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (f $ a3 :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (UnList y f xs :: a1 -> Type) | |
type Eval (Uncurry f '(x, y) :: a2 -> Type) | |
Defined in Fcf.Data.Common | |
type Eval (UnMaybe y f ('Just x) :: a1 -> Type) | |
type Eval (UnMaybe y f ('Nothing :: Maybe a2) :: a1 -> Type) | |
type Eval (FoldMap f ('Right x :: Either a3 a1) :: a2 -> Type) | |
type Eval (FoldMap f ('Left _a :: Either a3 a1) :: a2 -> Type) | |
type Eval (FoldMap f ('Just x) :: a2 -> Type) | |
type Eval (FoldMap f ('Nothing :: Maybe a1) :: a2 -> Type) | |
type Eval (FoldMap f (x ': xs) :: a2 -> Type) | |
type Eval (FoldMap f ('[] :: [a1]) :: a2 -> Type) | |
Defined in Fcf.Class.Foldable | |
type Eval (UnEither f g ('Right y :: Either a1 b) :: a2 -> Type) | |
type Eval (UnEither f g ('Left x :: Either a1 b) :: a2 -> Type) | |
type Eval (Pure2 f x y :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval ((f <=< g) x :: a2 -> Type) | |
type Eval (LiftM2 f x y :: a3 -> Type) | |
type Eval (Flip f y x :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (Foldr f y ('Right x :: Either a3 a1) :: a2 -> Type) | |
type Eval (Foldr f y ('Left _a :: Either a3 a1) :: a2 -> Type) | |
type Eval (Foldr f y ('Just x) :: a2 -> Type) | |
type Eval (Foldr f y ('Nothing :: Maybe a1) :: a2 -> Type) | |
type Eval (Foldr f y (x ': xs) :: a2 -> Type) | |
type Eval (Foldr f y ('[] :: [a1]) :: a2 -> Type) | |
Defined in Fcf.Class.Foldable | |
type Eval (On r f x y :: a2 -> Type) | |
type Eval (Over2 f g h x2 :: a2 -> Type) Source # | |
type Eval (Pure3 f x y z :: a2 -> Type) | |
Defined in Fcf.Combinators | |
type Eval (LiftM3 f x y z :: a4 -> Type) | |
type Eval (Bicomap f g r x y :: a4 -> Type) | |
type Eval (Tails (a2 ': as) :: [[a1]] -> Type) | |
type Eval (Tails ('[] :: [a]) :: [[a]] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Reverse l :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Init '[a2] :: Maybe [a1] -> Type) | |
type Eval (Init ('[] :: [a]) :: Maybe [a] -> Type) | |
type Eval (Tail (_a ': as) :: Maybe [a] -> Type) | |
type Eval (Tail ('[] :: [a]) :: Maybe [a] -> Type) | |
type Eval (Init (a2 ': (b ': as)) :: Maybe [a1] -> Type) | |
type Eval (Head (a2 ': _as) :: Maybe a1 -> Type) | |
type Eval (Head ('[] :: [a]) :: Maybe a -> Type) | |
type Eval (Last (a2 ': (b ': as)) :: Maybe a1 -> Type) | |
type Eval (Last '[a2] :: Maybe a1 -> Type) | |
type Eval (Last ('[] :: [a]) :: Maybe a -> Type) | |
type Eval (xs ++ ys :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Cons a2 as :: [a1] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Snoc lst a :: [k] -> Type) | |
type Eval (Rev (x ': xs) ys :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Rev ('[] :: [a]) ys :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Intersperse _1 ('[] :: [a]) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (PrependToAll sep (x ': xs) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (PrependToAll _1 ('[] :: [a]) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Intersperse sep (x ': xs) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Intercalate xs xss :: [a] -> Type) | |
Defined in Fcf.Data.List type Eval (Intercalate xs xss :: [a] -> Type) = Eval ((Concat :: [[a]] -> [a] -> Type) =<< Intersperse xs xss) | |
type Eval (Replicate n a2 :: [a1] -> Type) | |
type Eval (Take n as :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Drop n as :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (TakeWhile p (x ': xs) :: [a] -> Type) | |
type Eval (TakeWhile p ('[] :: [a]) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (DropWhile p (x ': xs) :: [a] -> Type) | |
type Eval (DropWhile p ('[] :: [a]) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Filter p (a2 ': as) :: [a1] -> Type) | |
type Eval (Filter _p ('[] :: [a]) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (FindIndex p (a2 ': as) :: Maybe Nat -> Type) | |
type Eval (FindIndex _p ('[] :: [a]) :: Maybe Nat -> Type) | |
type Eval (NumIter a s :: Maybe (k, Nat) -> Type) | |
type Eval (Find p (a2 ': as) :: Maybe a1 -> Type) | |
type Eval (Find _p ('[] :: [a]) :: Maybe a -> Type) | |
type Eval (Zip as bs :: [(a, b)] -> Type) | |
type Eval (UnfoldrCase _1 ('Nothing :: Maybe (a, b)) :: [a] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Unfoldr f c :: [a] -> Type) | |
type Eval (UnfoldrCase f ('Just ab) :: [a2] -> Type) | |
type Eval (SetIndex n a' as :: [k] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Lookup a as :: Maybe b -> Type) | |
type Eval (Map f (a2 ': as) :: [b] -> Type) | |
type Eval (Map f ('[] :: [a]) :: [b] -> Type) | |
Defined in Fcf.Class.Functor | |
type Eval (ConcatMap f xs :: [b] -> Type) | |
type Eval ('Just x <|> _1 :: Maybe a -> Type) Source # | |
type Eval (('Nothing :: Maybe a) <|> m :: Maybe a -> Type) Source # | |
type Eval (Map f ('Just a3) :: Maybe a2 -> Type) | |
type Eval (Map f ('Nothing :: Maybe a) :: Maybe b -> Type) | |
type Eval (ZipWith f (a2 ': as) (b2 ': bs) :: [c] -> Type) | |
type Eval (ZipWith _f _as ('[] :: [b]) :: [c] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (ZipWith _f ('[] :: [a]) _bs :: [c] -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Span p lst :: ([a], [a]) -> Type) | |
type Eval (Break p lst :: ([a], [a]) -> Type) | |
type Eval (Partition p lst :: ([a], [a]) -> Type) | |
type Eval (Unzip as :: ([a], [b]) -> Type) | |
type Eval (Cons2 '(a3, b) '(as, bs) :: ([a1], [a2]) -> Type) | |
Defined in Fcf.Data.List | |
type Eval (PartHelp p a2 '(xs, ys) :: ([a1], [a1]) -> Type) | |
Defined in Fcf.Data.List | |
type Eval (Map f ('Right a3 :: Either a2 a1) :: Either a2 b -> Type) | |
type Eval (Map f ('Left x :: Either a2 a1) :: Either a2 b -> Type) | |
type Eval (Map f '(x, a2) :: (k2, k1) -> Type) | |
Defined in Fcf.Class.Functor | |
type Eval ((f *** f') '(b2, b'2) :: (k1, k2) -> Type) | |
type Eval (First f2 x :: f1 a' b' -> Type) | |
type Eval (Second g x :: f a' b' -> Type) | |
type Eval (Bimap f g ('Right y :: Either a b1) :: Either a' b2 -> Type) | |
type Eval (Bimap f g ('Left x :: Either a1 b) :: Either a2 b' -> Type) | |
type Eval (Bimap f g '(x, y) :: (k1, k2) -> Type) | |
type Eval (Map f '(x, y, a2) :: (k2, k3, k1) -> Type) | |
Defined in Fcf.Class.Functor | |
type Eval (Map f '(x, y, z, a2) :: (k2, k3, k4, k1) -> Type) | |
Defined in Fcf.Class.Functor | |
type Eval (Map f '(x, y, z, w, a2) :: (k2, k3, k4, k5, k1) -> Type) | |
Defined in Fcf.Class.Functor |