extensible-0.4.2: Extensible, efficient, optics-friendly data types and effects

Copyright(c) Fumiaki Kinoshita 2017
LicenseBSD3
MaintainerFumiaki Kinoshita <fumiexcel@gmail.com>
Safe HaskellTrustworthy
LanguageHaskell2010

Data.Extensible.Product

Contents

Description

 

Synopsis

Basic operations

data h :* s #

The type of extensible products.

(:*) :: (k -> *) -> [k] -> *

Instances

(Corepresentable p, Comonad (Corep p), Functor f) => Extensible k f p ((:*) k) # 

Methods

pieceAt :: Membership f xs x -> Optic' * * ((:*) k) p (t h xs) (h x) #

nil :: h :* '[] #

An empty product.

(<:) :: h x -> (h :* xs) -> h :* (x ': xs) infixr 0 #

O(n) Prepend an element onto a product. Expressions like a <: b <: c <: nil are transformed to a single fromHList.

(<!) :: h x -> (h :* xs) -> h :* (x ': xs) infixr 0 #

Strict version of (<:).

hlength :: (h :* xs) -> Int #

The size of a product.

hmap :: (forall x. g x -> h x) -> (g :* xs) -> h :* xs #

Transform every element in a product, preserving the order.

hmap idid
hmap (f . g) ≡ hmap f . hmap g

hmapWithIndex :: (forall x. Membership xs x -> g x -> h x) -> (g :* xs) -> h :* xs #

Map a function to every element of a product.

hzipWith :: (forall x. f x -> g x -> h x) -> (f :* xs) -> (g :* xs) -> h :* xs #

zipWith for heterogeneous product

hzipWith3 :: (forall x. f x -> g x -> h x -> i x) -> (f :* xs) -> (g :* xs) -> (h :* xs) -> i :* xs #

zipWith3 for heterogeneous product

hfoldMap :: Monoid a => (forall x. h x -> a) -> (h :* xs) -> a #

Map elements to a monoid and combine the results.

hfoldMap f . hmap g ≡ hfoldMap (f . g)

hfoldMapWithIndex :: Monoid a => (forall x. Membership xs x -> g x -> a) -> (g :* xs) -> a #

hfoldMap with the membership of elements.

hfoldrWithIndex :: (forall x. Membership xs x -> h x -> r -> r) -> r -> (h :* xs) -> r #

Right-associative fold of a product.

htraverse :: Applicative f => (forall x. g x -> f (h x)) -> (g :* xs) -> f (h :* xs) #

Traverse all elements and combine the result sequentially. htraverse (fmap f . g) ≡ fmap (hmap f) . htraverse g htraverse pure ≡ pure htraverse (Comp . fmap g . f) ≡ Comp . fmap (htraverse g) . htraverse f

htraverseWithIndex :: Applicative f => (forall x. Membership xs x -> g x -> f (h x)) -> (g :* xs) -> f (h :* xs) #

hsequence :: Applicative f => (Comp f h :* xs) -> f (h :* xs) #

sequence analog for extensible products

Constrained fold

hfoldMapFor :: (Forall c xs, Monoid a) => proxy c -> (forall x. c x => h x -> a) -> (h :* xs) -> a #

hfoldMapWithIndexFor :: (Forall c xs, Monoid a) => proxy c -> (forall x. c x => Membership xs x -> h x -> a) -> (h :* xs) -> a #

hfoldMapWithIndex with a constraint for each element.

hfoldrWithIndexFor :: Forall c xs => proxy c -> (forall x. c x => Membership xs x -> h x -> r -> r) -> r -> (h :* xs) -> r #

hfoldrWithIndex with a constraint for each element.

Evaluating

hforce :: (h :* xs) -> h :* xs #

Evaluate every element in a product.

Update

haccumMap :: Foldable f => (a -> g :| xs) -> (forall x. Membership xs x -> g x -> h x -> h x) -> (h :* xs) -> f a -> h :* xs #

Accumulate sums on a product.

haccum :: Foldable f => (forall x. Membership xs x -> g x -> h x -> h x) -> (h :* xs) -> f (g :| xs) -> h :* xs #

haccum = haccumMap id

hpartition :: (Foldable f, Generate xs) => (a -> h :| xs) -> f a -> Comp [] h :* xs #

Group sums by type.

Lookup

hlookup :: Membership xs x -> (h :* xs) -> h x #

Get an element in a product.

hindex :: (h :* xs) -> Membership xs x -> h x #

Flipped hlookup

Generation

class Generate xs where #

Every type-level list is an instance of Generate.

Minimal complete definition

henumerate, hcount, hgenerateList

Methods

henumerate :: (forall x. Membership xs x -> r -> r) -> r -> r #

Enumerate all possible Memberships of xs.

hcount :: proxy xs -> Int #

Count the number of memberships.

hgenerateList :: Applicative f => (forall x. Membership xs x -> f (h x)) -> f (HList h xs) #

Enumerate Memberships and construct an HList.

Instances

Generate k ([] k) # 

Methods

henumerate :: (forall x. Membership [k] xs x -> r -> r) -> r -> r #

hcount :: proxy xs -> Int #

hgenerateList :: Applicative f => (forall x. Membership [k] xs x -> f (h x)) -> f (HList [k] h xs) #

Generate k xs => Generate k ((:) k x xs) # 

Methods

henumerate :: (forall a. Membership ((k ': x) xs) xs a -> r -> r) -> r -> r #

hcount :: proxy xs -> Int #

hgenerateList :: Applicative f => (forall a. Membership ((k ': x) xs) xs a -> f (h a)) -> f (HList ((k ': x) xs) h xs) #

hgenerate :: (Generate xs, Applicative f) => (forall x. Membership xs x -> f (h x)) -> f (h :* xs) #

htabulate :: Generate xs => (forall x. Membership xs x -> h x) -> h :* xs #

Construct a product using a function which takes a Membership.

hmap f (htabulate g) ≡ htabulate (f . g)
htabulate (hindex m) ≡ m
hindex (htabulate k) ≡ k

hrepeat :: Generate xs => (forall x. h x) -> h :* xs #

A product filled with the specified value.

hcollect :: (Functor f, Generate xs) => (a -> h :* xs) -> f a -> Comp f h :* xs #

The dual of htraverse

hdistribute :: (Functor f, Generate xs) => f (h :* xs) -> Comp f h :* xs #

The dual of hsequence

fromHList :: HList h xs -> h :* xs #

Convert HList into a product.

toHList :: forall h xs. (h :* xs) -> HList h xs #

Convert a product into an HList.

class (ForallF c xs, Generate xs) => Forall c xs where #

Every element in xs satisfies c

Minimal complete definition

henumerateFor, hgenerateListFor

Methods

henumerateFor :: proxy c -> proxy' xs -> (forall x. c x => Membership xs x -> r -> r) -> r -> r #

Enumerate all possible Memberships of xs with an additional context.

hgenerateListFor :: Applicative f => proxy c -> (forall x. c x => Membership xs x -> f (h x)) -> f (HList h xs) #

Instances

Forall k c ([] k) # 

Methods

henumerateFor :: proxy [k] -> proxy' xs -> (forall x. [k] x => Membership c xs x -> r -> r) -> r -> r #

hgenerateListFor :: Applicative f => proxy [k] -> (forall x. [k] x => Membership c xs x -> f (h x)) -> f (HList c h xs) #

(c x, Forall a c xs) => Forall a c ((:) a x xs) # 

Methods

henumerateFor :: proxy ((a ': x) xs) -> proxy' xs -> (forall b. (a ': x) xs b => Membership c xs b -> r -> r) -> r -> r #

hgenerateListFor :: Applicative f => proxy ((a ': x) xs) -> (forall b. (a ': x) xs b => Membership c xs b -> f (h b)) -> f (HList c h xs) #

hgenerateFor :: (Forall c xs, Applicative f) => proxy c -> (forall x. c x => Membership xs x -> f (h x)) -> f (h :* xs) #

htabulateFor :: Forall c xs => proxy c -> (forall x. c x => Membership xs x -> h x) -> h :* xs #

Pure version of hgenerateFor.

hrepeatFor :: Forall c xs => proxy c -> (forall x. c x => h x) -> h :* xs #

A product filled with the specified value.