sourcecode:
|
module Coosy.Derive ( derive, deriveFile )
where
import Control.Monad ( unless, when )
import Data.Char ( isSpace )
import Data.List ( intercalate )
import System.Environment ( getProgName )
import AbstractCurry.Types
import AbstractCurry.Files
import AbstractCurry.Select ( tconsArgsOfType )
import System.CurryPath ( runModuleActionQuiet, stripCurrySuffix )
import System.Process ( sleep )
derive :: IO ()
derive = do
progname <- getProgName
putStr $
"Program where type observers should be added (default: "++progname++"): "
answer <- getLine
let fileName = if all isSpace answer
then progname
else answer
msg <- deriveFile fileName
putStrLn msg
-- Derives observers to a given program file:
deriveFile :: String -> IO String
deriveFile progfile = do
let progName = stripCurrySuffix progfile
runModuleActionQuiet addOTypes progName
return $ unlines
[ "Observer functions have been added to:", progName, ""
, "A backup of the original file has been written to:"
, progName ++ ".curry.bak", ""
, "Don't forget to recompile the program and to reload it into your editor!"
]
addOTypes :: String -> IO ()
addOTypes fileName = do
let curryfile = fileName ++ ".curry"
progtext <- readFile curryfile
writeFile (curryfile ++ ".bak") progtext
when (coosyComment `elem` lines progtext) $ do
writeFile curryfile
(unlines (takeWhile (/= coosyComment) $ lines progtext))
sleep 1 -- wait for file to be written (has caused problems...)
prog <- readCurry fileName
appendFile curryfile ("\n\n" ++ coosyComment ++ "\n\n" ++ deriveProg prog)
where
coosyComment = "-- oTypes added by Coosy"
deriveProg :: CurryProg -> String
deriveProg (CurryProg _ _ _ _ _ typeDecls _ _) =
concatMap deriveTypeDecl typeDecls
deriveTypeDecl :: CTypeDecl -> String
deriveTypeDecl (CType (_,name) _ vs cs _) =
'o':name ++ " ::" ++ datactxt
++ concatMap (\i -> " Observer x"++show i++" ->") [1..arity]
++ " Observer "
++ brackets (arity>0) (name ++ derivePatArgs arity) ++"\n"++
concatMap (deriveCCons ('o':name) vs) cs ++"\n"
where arity = length vs
datactxt | arity == 0 = ""
| otherwise = brackets (arity>0)
(intercalate ", "
(map (\i -> "Data x" ++ show i)
[1 .. arity])) ++ " =>"
deriveTypeDecl (CTypeSyn (_,name) _ vs t) =
('o':name) ++ concatMap deriveTypeVar vs ++ "= " ++ deriveTypeExpr t ++ "\n"
deriveTypeDecl (CNewType _ _ _ _ _) = error "Cannot handle type synonyms"
deriveCCons :: String -> [CTVarIName] -> CConsDecl -> String
deriveCCons tname vs (CCons (_,cname) _ texps) =
tname ++deriveTypeVarPattern vs (usedVars texps) ++
' ':brackets (arity>0) (cname ++ derivePatArgs arity) ++
" = o" ++ show arity ++ concatMap deriveTypeExpr texps ++
' ':show cname ++ ' ':cname++derivePatArgs arity++"\n"
where arity = length texps
deriveCCons _ _ (CRecord _ _ _) = error "Cannot handle record constructors"
deriveTypeExpr :: CTypeExpr -> String
deriveTypeExpr (CTVar index) = deriveTypeVar index
deriveTypeExpr (CTCons tc) = deriveConsTypeExpr (tc,[])
deriveTypeExpr (CFuncType t1 t2) =
' ':'(':dropWhile (==' ') (deriveTypeExpr t1)++" ~>"++ deriveTypeExpr t2++")"
deriveTypeExpr t@(CTApply _ _) =
maybe (error "Cannot derive type applications")
deriveConsTypeExpr
(tconsArgsOfType t)
deriveConsTypeExpr :: ((a,String), [AbstractCurry.Types.CTypeExpr]) -> String
deriveConsTypeExpr ((_,name),ts)
| name=="[]" = " (oList"++concatMap deriveTypeExpr ts++")"
| ti>0 = " ("++tupleOName ti++concatMap deriveTypeExpr ts++")"
| otherwise = ' ':brackets (not (null ts))
('o':name++concatMap deriveTypeExpr ts)
where ti = tupleIndex name
deriveTypeVar :: CTVarIName -> String
deriveTypeVar (_,tvarname) = ' ':tvarname
--deriveTypeVar (index,_) | index < 26 = [' ',chr $ 97+index]
-- | otherwise = ' ':"t" ++ (show index)
derivePatArgs :: Int -> String
derivePatArgs n = concatMap (\ i->' ':'x':show i) [1..n]
deriveTypeVarPattern :: [CTVarIName] -> [CTVarIName] -> String
deriveTypeVarPattern [] _ = ""
deriveTypeVarPattern (v:vs) used
= (if elem v used then (deriveTypeVar v) else " _") ++
deriveTypeVarPattern vs used
usedVars :: [CTypeExpr] -> [CTVarIName]
usedVars [] = []
usedVars (CTVar index:ts) = index:usedVars ts
usedVars (CTCons _ : ts) = usedVars ts
usedVars (CFuncType t1 t2:ts) = usedVars (t1:t2:ts)
usedVars (CTApply tc ta : ts) = usedVars (tc:ta:ts)
tupleIndex :: String -> Int
tupleIndex s = case s of
('(':s1) -> countComma 1 s1
_ -> 0
tupleOName :: Int -> String
tupleOName arity | arity==2 = "oPair"
| arity==3 = "oTriple"
| otherwise = 'o' : (show arity ++ "Tuple")
countComma :: Int -> String -> Int
countComma _ [] = 0
countComma n [c] = if c==')' then n else 0
countComma n (',':s1:s) = countComma (n+1) (s1:s)
brackets :: Bool -> String -> String
brackets b s = if b then '(':s++")" else s
|