Ich suche nach einem Typinferenzalgorithmus für eine Sprache, die ich entwickle, aber ich konnte keinen finden, der meinen Anforderungen entspricht, da dies normalerweise entweder der Fall ist:
- à la Haskell, mit Polymorphismus, aber ohne Ad-hoc-Überlastung
- à la C ++ (Auto), bei dem Sie eine Ad-hoc-Überladung haben, die Funktionen jedoch monomorph sind
Insbesondere ist mein Typsystem (vereinfachend) (ich verwende die Haskellish-Syntax, aber dies ist sprachunabhängig):
data Type = Int | Double | Matrix Type | Function Type Type
Und ich habe einen Operator *, der einige Überlastungen hat:
Int -> Int -> Int
(Function Int Int) -> Int -> Int
Int -> (Function Int Int) -> (Function Int Int)
(Function Int Int) -> (Function Int Int) -> (Function Int Int)
Int -> Matrix Int -> Matrix Int
Matrix Int -> Matrix Int -> Matrix Int
(Function (Matrix Int) (Matrix Int)) -> Matrix Int -> Matrix Int
Usw...
Und ich möchte mögliche Typen für ableiten
(2*(x => 2*x))*6
(2*(x => 2*x))*{{1,2},{3,4}}
Der erste ist Int
der zweite Matrix Int
.
Beispiel (das funktioniert nicht):
{-# LANGUAGE OverlappingInstances, MultiParamTypeClasses,
FunctionalDependencies, FlexibleContexts,
FlexibleInstances, UndecidableInstances #-}
import qualified Prelude
import Prelude hiding ((+), (*))
import qualified Prelude
newtype WInt = WInt { unwrap :: Int }
liftW f a b = WInt $ f (unwrap a) (unwrap b)
class Times a b c | a b -> c where
(*) :: a -> b -> c
instance Times WInt WInt WInt where
(*) = liftW (Prelude.*)
instance (Times a b c) => Times a (r -> b) (r -> c) where
x * g = \v -> x * g v
instance Times (a -> b) a b where
f * y = f y
two = WInt 2
six = WInt 6
test :: WInt
test = (two*(\x -> two*x))*six
main = undefined