gpt4 book ai didi

haskell - 为什么 Conduit 和 Pipe 不能有 Arrow 实例?

转载 作者:行者123 更新时间:2023-12-04 19:33:32 25 4
gpt4 key购买 nike

reddit 上有一个存档线程,上面说基本上管道/管道不能是箭头 b/c 箭头需要同步。该线程链接在这里https://www.reddit.com/r/haskell/comments/rq1q5/conduitssinks_and_refactoring_arrows/

我看不出“同步”从何而来,因为那不是箭头定义的一部分。另外,我在 github https://github.com/cmahon/interactive-brokers 上偶然发现了这个项目。将管道明确视为箭头。为方便起见,我将实例定义粘贴到此处。我在这里缺少什么?

-- The code in this module was provided by Gabriel Gonzalez

{-# LANGUAGE RankNTypes #-}

module Pipes.Edge where

import Control.Arrow
import Control.Category (Category((.), id))
import Control.Monad ((>=>))
import Control.Monad.Trans.State.Strict (get, put)
import Pipes
import Pipes.Core (request, respond, (\>\), (/>/), push, (>~>))
import Pipes.Internal (unsafeHoist)
import Pipes.Lift (evalStateP)
import Prelude hiding ((.), id)

newtype Edge m r a b = Edge { unEdge :: a -> Pipe a b m r }

instance (Monad m) => Category (Edge m r) where
id = Edge push
(Edge p2) . (Edge p1) = Edge (p1 >~> p2)

instance (Monad m) => Arrow (Edge m r) where
arr f = Edge (push />/ respond . f)
first (Edge p) = Edge $ \(b, d) ->
evalStateP d $ (up \>\ unsafeHoist lift . p />/ dn) b
where
up () = do
(b, d) <- request ()
lift $ put d
return b
dn c = do
d <- lift get
respond (c, d)

instance (Monad m) => ArrowChoice (Edge m r) where
left (Edge k) = Edge (bef >=> (up \>\ (k />/ dn)))
where
bef x = case x of
Left b -> return b
Right d -> do
_ <- respond (Right d)
x2 <- request ()
bef x2
up () = do
x <- request ()
bef x
dn c = respond (Left c)

runEdge :: (Monad m) => Edge m r a b -> Pipe a b m r
runEdge e = await >>= unEdge e

最佳答案

考虑这个管道:yield '*' :: Pipe x Char IO () .我们可以将它包装在一个像 newtype PipeArrow a b = PipeArrow { getPipeArrow :: Pipe a b IO () } 这样的新型适配器中。并尝试定义 Arrow实例那里。

买怎么写first :: PipeArrow b c -> PipeArrow (b, d) (c, d)适用于 yield '*' ?管道从不等待来自上游的值。我们将不得不产生一个 d凭空而来,陪伴'*' .

管道满足大多数箭头定律(以及 ArrowChoice ),但 first不能以合法的方式实现。

您发布的代码没有定义 Arrow Pipe 的实例,但对于从上游获取值并返回 Pipe 的函数.

关于haskell - 为什么 Conduit 和 Pipe 不能有 Arrow 实例?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/42418842/

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