- html - 出于某种原因,IE8 对我的 Sass 文件中继承的 html5 CSS 不友好?
- JMeter 在响应断言中使用 span 标签的问题
- html - 在 :hover and :active? 上具有不同效果的 CSS 动画
- html - 相对于居中的 html 内容固定的 CSS 重复背景?
在一定程度上,可以将类与镜头混合以模拟过载的记录字段。例如,参见 makeFields
在 Control.Lens.TH .我试图弄清楚是否有一种很好的方法可以为某些类型重用与镜头相同的名称,并为其他类型重用相同的名称。值得注意的是,给定一个产品总和,每个产品都可以有透镜,这将退化为总和的遍历。我能想到的最简单的事情是这个**:
第一次尝试
class Boo booey where
type Con booey :: (* -> *) -> Constraint
boo :: forall f . Con booey f => (Int -> f Int) -> booey -> f booey
data Boop = Boop Int Char
instance Boo Boop where
type Con Boop = Functor
boo f (Boop i c) = (\i' -> Boop i' c) <$> f i
instance Boo boopy => Boo (Maybe boopy) where
Traversal
无论选择何种底层证券
Boo
.
Con
家庭。这有点恶心。首先,更改类:
class LTEApplicative c where
lteApplicative :: Applicative a :- c a
class LTEApplicative (Con booey) => Boo booey where
type Con booey :: (* -> *) -> Constraint
boo :: forall f . Con booey f => (Int -> f Int) -> booey -> f booey
Boo
实例带有明确的证据表明它们的
boo
产生
Traversal' booey Int
.还有一些东西:
instance LTEApplicative Applicative where
lteApplicative = Sub Dict
instance LTEApplicative Functor where
lteApplicative = Sub Dict
-- flub :: Boo booey => Traversal booey booey Int Int
flub :: forall booey f . (Boo booey, Applicative f) => (Int -> f Int) -> booey -> f booey
flub = case lteApplicative of
Sub (Dict :: Dict (Con booey f)) -> boo
instance Boo boopy => Boo (Maybe boopy) where
type Con (Maybe boopy) = Applicative
boo _ Nothing = pure Nothing
boo f (Just x) = Just <$> hum f x
where hum :: Traversal' boopy Int
hum = flub
Boop
示例工作不变。
boo
产生
Lens
或
Traversal
在适当的情况下,我们总是可以将其用作
Traversal
,但每次我们想这样做时,我们都必须先拖入它确实是一个的证据。当然,这对于实现重载记录字段来说太不方便了!有没有更好的方法?
{-# LANGUAGE PolyKinds, TypeFamilies,
TypeOperators, FlexibleContexts,
ScopedTypeVariables, RankNTypes,
KindSignatures #-}
import Control.Lens
import Data.Constraint
最佳答案
以下内容以前对我有用:
{-# LANGUAGE MultiParamTypeClasses, FlexibleInstances #-}
import Control.Lens
data Boop = Boop Int Char deriving (Show)
class HasBoo f s where
boo :: LensLike' f s Int
instance Functor f => HasBoo f Boop where
boo f (Boop a b) = flip Boop b <$> f a
instance (Applicative f, HasBoo f s) => HasBoo f (Maybe s) where
boo = traverse . boo
name
字段限制为
IsString
)。
{-# LANGUAGE
UndecidableInstances, MultiParamTypeClasses,
FlexibleInstances, FunctionalDependencies, TemplateHaskell #-}
import Control.Lens
data Foo a b = Foo {_fooFieldA :: a, _fooFieldB :: b} deriving Show
makeLenses ''Foo
class HasFieldA f s t a b | s -> a, t -> b, s b -> t, t a -> s where
fieldA :: LensLike f s t a b
instance Functor f => HasFieldA f (Foo a b) (Foo a' b) a a' where
fieldA = fooFieldA
instance (Applicative f, HasFieldA f s t a b) => HasFieldA f (Maybe s) (Maybe t) a b where
fieldA = traverse . fieldA
{-# LANGUAGE
UndecidableInstances, MultiParamTypeClasses,
RankNTypes, TypeFamilies, DataKinds,
FlexibleInstances, FunctionalDependencies,
TemplateHaskell #-}
import Control.Lens hiding (has)
import GHC.TypeLits
import Data.Proxy
class Has (sym :: Symbol) f s t a b | s sym -> a, sym t -> b, s b -> t, t a -> s where
has' :: Proxy sym -> LensLike f s t a b
data Foo a = Foo {_fooFieldA :: a, _fooFieldB :: Int} deriving Show
makeLenses ''Foo
instance Functor f => Has "fieldA" f (Foo a) (Foo a') a a' where
has' _ = fooFieldA
{-# LANGUAGE TypeApplications #-}
has :: forall (sym :: Symbol) f s t a b. Has sym f s t a b => LensLike f s t a b
has = has' (Proxy :: Proxy sym)
instance (Applicative f, Has "fieldA" f s t a b) => Has "fieldA" f (Maybe s) (Maybe t) a b where
has' _ = traverse . has @"fieldA"
> Just (Foo 0 1) ^? has @"fieldA"
Just 0
> Foo 0 1 & has @"fieldA" +~ 10
Foo {_fooFieldA = 10, _fooFieldB = 1}
关于haskell - 如何在镜头中使用过载的记录场?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/34970709/
使用镜头更新集合中元素的最佳方法是什么?例如: case class Ingredient(name: String, quantity: Int) case class Recipe(val ing
有没有办法在最后一次使用 hakell 镜头之前获取元素?例如,我有这样一个结构: pp = (1,2,3,4) 我想做类似 pp ^. _almostLast 的事情并获得 3 .我不能使用 _3
我不断深入研究 Kmett 的镜头;今天我试图编写一些自定义遍历,到目前为止,我已经成功地通过组合现有的遍历来创建新的遍历,但我正在做一些更复杂的事情并陷入困境。 我正在编写一个文本编辑器,我只是添加
我想知道 Haskell 中是否有身份镜头。一个镜头identity这样如果我有一个类型 data MyType = MyType { _myField :: Int } ,那我可以做myType ^
我想写: minimum $ map _x elems 使用镜头。我想用minimumOf镜头,但我无法从它的类型中弄清楚如何使用它。 我正在寻找类似的东西 elems ^.. minimumOf x
我有兴趣为我的 monad 转换器堆栈获得缩放功能,该功能定义如下: newtype Awesome a = Awesome (StateT AwesomeState (ExceptT B.ByteS
像 Maybe (Lens' a b) 这样的类型不起作用,因为 Lens' 在引擎盖下是 Rank-2 类型,如果没有 -XImpredicativeTypes,则无法将其包装在类型构造函数中扩展名
有一个 Scalaz map 镜头的例子 here :丹伯顿称之为 containsKey ,它的灵感来自 Edward Kmett 的演讲。还有一个叫mapVPLens的东西在 Scalaz 7 中
我有那些镜头: getB :: Lens' A (Maybe B) getC :: Prism' B C 如何从 A 中提取 Maybe C?我能找到的最好的: case A ^. getB of
如果您浏览有关镜头的Lens条目,Lens Github的存储库,甚至是有关Lens的Google,您会发现很多局部参考,例如入门教程/视频,示例,概述等。由于我已经了解大多数基本知识,因此我正在寻找
我想将谷歌镜头服务集成到我的 android 应用程序中,但我没有得到任何直接的方法来实现它,也没有任何库或任何谷歌 API。 任何人都可以帮助我在我的 android 应用程序中实现 google
如果我有一个用于嵌套记录的镜头,其中每个镜头都返回一个也许,我怎样才能让它们组合,以便如果“遍历”中有任何内容返回Nothing 最终结果是Nothing? data Client = Client
Noobie 到 Ramda。所以,我面临着一些深度状态更新问题。有人推荐了 Ramda。现在我需要一些帮助。这是我的 react 状态 steps: { currentStep: 1
社区,你好👋。我遇到了一个小问题。我有这样一个数据结构 { "type": "Shoes", "gender": "female", "userInfo": {
谁能解释*什么是 OCaml 中的镜头? 我试着用谷歌搜索,但几乎所有这些都在 Haskell 的世界里。 只是希望在 OCaml 的世界中对它进行一些简单的演示,比如它是什么,它可以用来做什么等等。
我有以下代码。我希望能够在给定游戏状态时修改活跃玩家的生活。我想出了一个 activePlayer镜头,但是当我尝试将它与 -= 结合使用时运算符(operator)我收到以下错误: > over (
我一直在阅读this article并且在他们的一节中指出: Lenses compose backwards. Can't we make (.) behave like functions? Yo
我喜欢在 uiwebview 上禁用缩放/镜头。但是,我不希望任何用户选择在此过程中被禁用,即我不能在我的 css 中使用以下内容。 -webkit-user-select:none 最佳答案 如果您
至少有三个流行的库用于访问和操作记录字段。我所知道的有:数据访问器、fclabels 和镜头。 我个人从数据访问器开始,现在正在使用它们。然而,最近在 haskell-cafe 上,有人认为 fcla
我正在尝试通过在 Haskell 中实现镜头来了解镜头。我已经实现了view组合器如下: {-# LANGUAGE RankNTypes #-} import Control.Applicative
我是一名优秀的程序员,十分优秀!