vec-optics-0.3: Vec: length-indexed (sized) list: optics support

Safe HaskellNone
LanguageHaskell2010

Data.Vec.Lazy.Inline.Optics

Contents

Synopsis

Indexing

ix :: forall n a. InlineInduction n => Fin n -> Lens' (Vec n a) a Source #

Index lens.

>>> view (ix (FS FZ)) ('a' ::: 'b' ::: 'c' ::: VNil)
'b'
>>> set (ix (FS FZ)) 'x' ('a' ::: 'b' ::: 'c' ::: VNil)
'a' ::: 'x' ::: 'c' ::: VNil

_Cons :: Iso (Vec (S n) a) (Vec (S n) b) (a, Vec n a) (b, Vec n b) Source #

Match on non-empty Vec.

Note: lens _Cons is a Prism. In fact, Vec n a cannot have an instance of Cons as types don't match.

_head :: Lens' (Vec (S n) a) a Source #

Head lens. Note: lens _head is a Traversal'.

>>> view _head ('a' ::: 'b' ::: 'c' ::: VNil)
'a'
>>> set _head 'x' ('a' ::: 'b' ::: 'c' ::: VNil)
'x' ::: 'b' ::: 'c' ::: VNil

_tail :: Lens' (Vec (S n) a) (Vec n a) Source #

Tail lens.

Conversions

_Pull :: InlineInduction n => Iso (Vec n a) (Vec n b) (Vec n a) (Vec n b) Source #

An Iso from toPull and fromPull.

_Vec :: InlineInduction n => Prism' [a] (Vec n a) Source #

Prism from list.

>>> preview _Vec "foo" :: Maybe (Vec N.Nat3 Char)
Just ('f' ::: 'o' ::: 'o' ::: VNil)
>>> preview _Vec "foo" :: Maybe (Vec N.Nat2 Char)
Nothing
>>> review _Vec (True ::: False ::: VNil)
[True,False]