{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE TypeFamilies #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module Data.RAVec.Tree.Optics (
ix,
) where
import Control.Applicative ((<$>))
import Data.Wrd (Wrd (..))
import Prelude (Functor)
import qualified Optics.Core as L
import Data.RAVec.Tree
type LensLikeVL f s t a b = (a -> f b) -> s -> f t
type LensLikeVL' f s a = LensLikeVL f s s a a
ix :: Wrd n -> L.Lens' (Tree n a) a
ix i = L.lensVL (ixVL i)
ixVL :: Functor f => Wrd n -> LensLikeVL' f (Tree n a) a
ixVL WE f (Leaf x) = Leaf <$> f x
ixVL (W0 is) f (Node x y) = (`Node` y) <$> ixVL is f x
ixVL (W1 is) f (Node x y) = (x `Node`) <$> ixVL is f y
instance L.FunctorWithIndex (Wrd n) (Tree n) where
imap = imap
instance L.FoldableWithIndex (Wrd n) (Tree n) where
ifoldMap = ifoldMap
ifoldr = ifoldr
instance L.TraversableWithIndex (Wrd n) (Tree n) where
itraverse = itraverse
instance L.Each (Wrd n) (Tree n a) (Tree n b) a b where
type instance L.Index (Tree n a) = Wrd n
type instance L.IxValue (Tree n a) = a
instance L.Ixed (Tree n a) where
type IxKind (Tree n a) = L.A_Lens
ix = ix