prism 是用于聚焦到副产品类型的光学元件,而affine traversal是一种可以聚焦在1个元素中的0的光学元件,即AffineTraversal s t a b
是同构的(s -> Maybe a, (s, b) -> t)
。据我所知,如果镜头由棱镜组成,我们会得到一个仿射遍历,前提是使用了适当的棱镜编码。
我感兴趣的是将那个(幼稚)配方中的Maybe
移动到设置器侧而不是吸气器侧,这样我就可以使用一个总是提取一个元素的光学元件,但可能无法放置它回来了。
我的用例与细化类型有关。想象一下,我们有一个A
类型及其细化B
(B ⊆ A
)。然后有一个棱镜refined :: Prism' A B
:A
可能是也可能不是B
,但每个B
都可以re
进入A
}}。结合Lens' C A
和refined
,我们进行了仿射遍历。在另一个方向,人们可以想象一个视觉unrefined
比re refined
更聪明一点:A
可以变成Just b
,如果它是有效的B
{1}}或Nothing
,如果不是。现在,如果我们将Lens' C B
和unrefined
结合起来,我们会进行双重仿射遍历:它始终可以从A
获取C
,但可以放回任何旧的A
可能会违反C
的不变量而导致Nothing
而不是Just c
。可以以类似的方式确保更复杂的不变量。
有趣的是,Scala的monocle库为细化类型提供了棱镜,但没有反向方向。
我很难为这些(s -> a, b -> Maybe t)
和(s -> a, (s, b) -> Maybe t)
小发明制定法律,我想知道更抽象的光学公式是否有用。
我知道用透镜,我们有
type Lens s t a b = forall p. Strong p => p a b -> p s t
type Prism s t a b = forall p. Choice p => p a b -> p s t
type AffineTraversal s t a b = forall p. (Strong p, Choice p) => p a b -> p s t
这清楚地表明镜头放大到产品类型,棱镜放大到副产品类型,仿射遍历能够放大代数数据类型(产品或副产品,不能少)。
答案是否与Cochoice
甚至Costrong
相关联(从profunctor中删除产品/副产品而不是引入它)?然而,我无法从它们中恢复天真的配方......
答案 0 :(得分:3)
这是半个答案,显示了Cochoice
视神经与(s -> a, b -> Maybe t)
之间的对应关系。
{-# LANGUAGE RankNTypes #-}
module P where
import Data.Profunctor
import Control.Monad
data P a b s t = P (s -> a) (b -> Maybe t)
instance Profunctor (P a b) where
dimap f g (P u v) = P (u . f) (fmap g . v)
instance Cochoice (P a b) where
unleft (P u v) = P (u . Left) (v >=> v') where
v' (Left t) = Just t
v' (Right _) = Nothing
type Coprism s t a b = forall p. Cochoice p => p a b -> p s t
type ACoprism s t a b = P a b a b -> P a b s t
fromCoprism :: ACoprism s t a b -> P a b s t
fromCoprism p = p (P id Just)
toCoprism :: P a a s t -> Coprism s t a a
toCoprism (P u v) = unleft . dimap f g where
f (Left s) = u s
f (Right a) = a
g b = case v b of
Nothing -> Right b
Just t -> Left t