编辑:已解决。我不知道在源文件中启用语言扩展无法在GHCi中启用语言扩展。解决方案是在GHCi中:set FlexibleContexts
。
我最近发现Haskell中的类和实例中的类型声明是Horn子句。因此,我将算法操作从 Prolog的艺术,第3章编码到Haskell中。例如:
fac(0,s(0)).
fac(s(N),F) :- fac(N,X), mult(s(N),X,F).
class Fac x y | x -> y
instance Fac Z (S Z)
instance (Fac n x, Mult (S n) x f) => Fac (S n) f
pow(s(X),0,0) :- nat(X).
pow(0,s(X),s(0)) :- nat(X).
pow(s(N),X,Y) :- pow(N,X,Z), mult(Z,X,Y).
class Pow x y z | x y -> z
instance (N n) => Pow (S n) Z Z
instance (N n) => Pow Z (S n) (S Z)
instance (Pow n x z, Mult z x y) => Pow (S n) x y
在Prolog中,为证明中的(逻辑)变量实例化值。但是,我不明白如何在Haskell中实例化类型变量。也就是说,我不明白Haskell等同于Prolog查询
?-f(X1,X2,...,Xn)
是。我认为
:t undefined :: (f x1 x2 ... xn) => xi
会导致Haskell实例化xi
,但即使启用了Non type-variable argument in the constraint
,也会出现FlexibleContexts
错误。
答案 0 :(得分:3)
对Prolog样本不确定,但我会以下列方式在Haskell中定义:
{-# LANGUAGE MultiParamTypeClasses, EmptyDataDecls, FlexibleInstances,
FlexibleContexts, UndecidableInstances, TypeFamilies, ScopedTypeVariables #-}
data Z
data S a
type One = S Z
type Two = S One
type Three = S Two
type Four = S Three
class Plus x y r
instance (r ~ a) => Plus Z a r
instance (Plus a b p, r ~ S p) => Plus (S a) b r
p1 = undefined :: (Plus Two Three r) => r
class Mult x y r
instance (r ~ Z) => Mult Z a r
instance (Mult a b m, Plus m b r) => Mult (S a) b r
m1 = undefined :: (Mult Two Four r) => r
class Fac x r
instance (r ~ One) => Fac Z r
instance (Fac n r1, Mult (S n) r1 r) => Fac (S n) r
f1 = undefined :: (Fac Three r) => r
class Pow x y r
instance (r ~ One) => Pow x Z r
instance (r ~ Z) => Pow Z y r
instance (Pow x y z, Mult z x r) => Pow x (S y) r
pw1 = undefined :: (Pow Two Four r) => r
-- Handy output
class (Num n) => ToNum a n where
toNum :: a -> n
instance (Num n) => ToNum Z n where
toNum _ = 0
instance (ToNum a n) => ToNum (S a) n where
toNum _ = 1 + toNum (undefined :: a)
main = print $ (toNum p1, toNum m1, toNum f1, toNum pw1)
<强>更新强>
正如danportin在下面的评论中指出的那样,TypeFamilies“Lazy pattern”(在实例上下文中)在这里不需要(他的初始代码更短更干净)。
虽然我可以在这个问题的上下文中考虑这个模式的一个应用:我们想要在我们的类型级算术中添加布尔逻辑:
data HTrue
data HFalse
-- Will not compile
class And x y r | x y -> r
instance And HTrue HTrue HTrue
instance And a b HFalse -- we do not what to enumerate all the combination here - they all HFalse
但由于“功能依赖冲突”,这将无法编译。 在我看来,我们仍然可以在没有fundeps的情况下表达这种重叠的情况:
class And x y r
instance (r ~ HTrue) => And HTrue HTrue r
instance (r ~ HFalse) => And a b r
b1 = undefined :: And HTrue HTrue r => r -- HTrue
b2 = undefined :: And HTrue HFalse r => r -- HFalse
这绝对不是最好的方式(它需要IncoherentInstances)。所以也许有人可以建议另一种不那么“创伤”的方法。