{-# LANGUAGE Rank2Types #-}
module Data.Typeable.Lens
( _cast
, _gcast
) where
import Prelude ()
import Control.Lens
import Control.Lens.Internal.Prelude
import Data.Maybe (fromMaybe)
import Data.Typeable
_cast :: (Typeable s, Typeable a) => Traversal' s a
_cast f s = case cast s of
Just a -> fromMaybe (error "_cast: recast failed") . cast <$> f a
Nothing -> pure s
{-# INLINE _cast #-}
_gcast :: (Typeable s, Typeable a) => Traversal' (c s) (c a)
_gcast f s = case gcast s of
Just a -> fromMaybe (error "_gcast: recast failed") . gcast <$> f a
Nothing -> pure s
{-# INLINE _gcast #-}