gpt4 book ai didi

haskell - 棱镜或仿射遍历的对偶是什么?

转载 作者:行者123 更新时间:2023-12-03 15:06:01 25 4
gpt4 key购买 nike

棱镜是一种用于聚焦副产品类型的光学器件,而 affine traversal是一种可以聚焦在 1 个元素的 0 处的光学器件,即 AffineTraversal s t a b(s -> Maybe a, (s, b) -> t) 同构.据我所知,如果使用适当的棱镜编码,当镜头由棱镜组成时,我们会得到仿射遍历。

我有兴趣移动 Maybe在那个(天真的)公式中, setter 侧而不是 setter/getter 侧,这样我就可以拥有一个总是提取一个元素的光学元件,但可能无法将其放回原处。

我的用例与细化类型有关。假设我们有一个类型 A及其改进B (B ⊆ A)。然后是棱镜refined :: Prism' A B : 一个 A可能是也可能不是有效的 B , 但每个 B可以是re进入 A .结合 Lens' C Arefined ,我们有一个仿射遍历。在另一个方向,人们可以想象一个光学 unrefinedre refined 更聪明一点: 一个 A可以变成Just b , 如果它是有效的 B , 或 Nothing ,如果不是。现在如果我们结合 Lens' C Bunrefined ,我们有我们的双仿射遍历:它总是可以获得A来自 C , 但放回任何旧的 A可能违反 C的不变量和产量 Nothing而不是 Just c .可以以类似的方式确保更复杂的不变量。

有趣的是,monocle Scala 库为细化类型提供了棱镜,但没有提供相反方向的棱镜。

我很难为这些 (s -> a, b -> Maybe t) 制定法律和 (s -> a, (s, b) -> Maybe t)小发明,我想知道更抽象的光学公式是否有帮助。

我知道用 profunctor 镜头,我们有

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中删除产品/副产品而不是引入它)?但是,我无法从他们那里恢复幼稚的表述……

最佳答案

这是半个答案,显示了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

关于haskell - 棱镜或仿射遍历的对偶是什么?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/49373949/

25 4 0
Copyright 2021 - 2024 cfsdn All Rights Reserved 蜀ICP备2022000587号
广告合作:1813099741@qq.com 6ren.com