如何将字符串解析为Haskell中的函数?

时间:2013-05-21 20:39:17

标签: haskell text-parsing

我想要一个看起来像这样的函数

readFunc :: String -> (Float -> Float)

运行类似这样的东西

>(readFunc "sin") (pi/2)
>1.0

>(readFunc "(+2)") 3.0
>5.0

>(readFunc "(\x -> if x > 5.0 then 5.0 else x)") 2.0
>2.0

>(readFunc "(\x -> if x > 5.0 then 5.0 else x)") 7.0
>5.0

非常天真的方法(请注意,这必须使用{-# LANGUAGE FlexibleContexts #-}编译)

readFunc :: (Read (Float -> Float)) => String -> (Float -> Float)
readFunc s = read s

给出

No instance for (Read (Float -> Float)) ...

这是有道理的,因为不存在这样的实例。我理解我可以通过编写从StringFloat -> Float的地图来逐个字符地解析输入字符串,但我希望能够解析前奏中至少最常见的函数,甚至可能是比我想承诺更多的工作。这样做有简单的方法吗?

使用提示

只需一个解决方案
import Language.Haskell.Interpreter hiding (typeOf)
import Data.Typeable (typeOf)

data Domain = Dom Float Float Float Float Domain
            | SDom Float Float Float Float 
            deriving (Show, Read)

--gets all the points that will appear in the domain
points (SDom a b c d) m = [(x, y)|x <- [a, a+m .. b], y <- [c, c+m .. d]]
points (Dom a b c d next) m = points next m ++ [(x, y)|x <- [a, a+m .. b], y <- [c, c+m .. d]]

readFunc = do
    putStrLn "Enter a domain (as Dom x-min x-max y-min y-max subdomain, or, SDom x-min x-max y-min y-max)"
    domain' <- getLine
    let domain = (read domain') :: Domain
    --
    putStrLn "Enter a mesh size"
    meshSize' <- getLine
    let meshSize = (read meshSize') :: Float 
    --
    putStrLn "Enter an initial value function (as f(x,y))"
    func' <- getLine
    values' <- runInterpreter $ setImports["Prelude"] >>
                                eval ("map (\\(x,y) -> " ++ func' ++ ")" ++ show (points domain meshSize))
    let values = (\(Right v) -> (read v)::([Float])) values'

    --the haskell expression being evaluated
    putStrLn $ ("map (\\(x,y) -> " ++ func' ++ ")" ++ show (points domain meshSize)) 

    --prints the actual values
    putStrLn $ show values 

    --the type is indeed [float]
    putStrLn $ show $ typeOf values 

1 个答案:

答案 0 :(得分:9)

您可以使用hint包或plugins。我会告诉你前者(部分是因为我的Windows安装显然有点破坏,因为cabal并不认为我安装了C,所以cabal安装插件失败了。)

字符串 - &gt;功能很简单:

import Language.Haskell.Interpreter

getF :: String -> IO (Either InterpreterError (Float -> Float))
getF xs = runInterpreter $ do
   setImports ["Prelude"]
   interpret xs (as :: Float -> Float)

您可能希望将其他模块添加到导入列表中。这测试为

ghci> getF "sin" >>= \(Right f) -> print $ f (3.1415927/2)
1.0
ghci> getF "(\\x -> if x > 5.0 then 5.0 else x)" >>= \(Right f) -> print $ f 7
5.0

(注意转义转义字符\。)

错误消息

您可能已经注意到,结果包含在Either数据类型中。 Right f输出正确,Left err提供InterpreterError消息,这非常有用:

ghci> getF "sinhh" >>= \(Left err) -> print err
WontCompile [GhcError {errMsg = "Not in scope: `sinhh'\nPerhaps you meant `sinh' (imported from Prelude)"}]

玩具程序示例

当然,您可以使用either代码来处理此问题。让我们做一个虚假的例子respond。你真实的将包含你的程序的所有数学。

respond :: (Float -> Float) -> IO ()
respond f = do
   -- insert cunning numerical method instead of
   let result = f 5
   print result

您的程序的简单,一次尝试,无益的版本可能是

main = 
   putStrLn "Enter your function please:"
   >> getLine 
   >>= getF 
   >>= either print respond 

示例会话

ghci> main
Enter your function please:
\x -> x^2 + 4
29.0
ghci> main
Enter your function please:
ln
WontCompile [GhcError {errMsg = "Not in scope: `ln'"}]

它会为您进行类型检查:

ghci> main
Enter your function please:
(:"yo")
WontCompile [GhcError {errMsg = "Couldn't match expected type `GHC.Types.Float'\n            with actual type `GHC.Types.Char'"}]