X-Git-Url: http://git.megacz.com/?p=ghc-hetmet.git;a=blobdiff_plain;f=compiler%2Fparser%2FRdrHsSyn.lhs;h=5d54c2f02cbc95726004808b5d0d82af1e1b477b;hp=a914bbaa59eab04d76027b8b1dd3251be4bdb6d1;hb=1fede4bc9501744bf2269ce2a4cb9fb735969caa;hpb=58521c72cec262496dabf5fffb057d25ab17a0f7 diff --git a/compiler/parser/RdrHsSyn.lhs b/compiler/parser/RdrHsSyn.lhs index a914bba..5d54c2f 100644 --- a/compiler/parser/RdrHsSyn.lhs +++ b/compiler/parser/RdrHsSyn.lhs @@ -21,18 +21,14 @@ module RdrHsSyn ( findSplice, checkDecBrGroup, -- Stuff to do with Foreign declarations - CallConv(..), - mkImport, -- CallConv -> Safety - -- -> (FastString, RdrName, RdrNameHsType) - -- -> P RdrNameHsDecl - mkExport, -- CallConv - -- -> (FastString, RdrName, RdrNameHsType) - -- -> P RdrNameHsDecl + mkImport, + parseCImport, + mkExport, mkExtName, -- RdrName -> CLabelString mkGadtDecl, -- [Located RdrName] -> LHsType RdrName -> ConDecl RdrName mkSimpleConDecl, mkDeprecatedGadtRecordDecl, - + -- Bunch of functions in the parser monad for -- checking and constructing values checkPrecP, -- Int -> P Int @@ -62,20 +58,24 @@ import RdrName ( RdrName, isRdrTyVar, isRdrTc, mkUnqual, rdrNameOcc, import BasicTypes ( maxPrecedence, Activation, RuleMatchInfo, InlinePragma(..), InlineSpec(..), alwaysInlineSpec, neverInlineSpec ) -import Lexer ( P, failSpanMsgP, extension, standaloneDerivingEnabled, bangPatEnabled ) +import Lexer import TysWiredIn ( unitTyCon ) -import ForeignCall ( CCallConv(..), Safety, CCallTarget(..), CExportSpec(..), - DNCallSpec(..), DNKind(..), CLabelString ) +import ForeignCall import OccName ( srcDataName, varName, isDataOcc, isTcOcc, occNameString ) import PrelNames ( forall_tv_RDR ) +import DynFlags import SrcLoc import OrdList ( OrdList, fromOL ) import Bag ( Bag, emptyBag, snocBag, consBag, foldrBag ) import Outputable import FastString +import Maybes -import List ( isSuffixOf, nubBy ) +import Control.Applicative ((<$>)) +import Text.ParserCombinators.ReadP as ReadP +import Data.List ( nubBy ) +import Data.Char ( isAscii, isAlphaNum, isAlpha ) #include "HsVersions.h" \end{code} @@ -720,12 +720,14 @@ checkPat loc e args -- OK to let this happen even if bang-patterns checkPat loc (L _ (HsApp f x)) args = do { x <- checkLPat x; checkPat loc f (x:args) } checkPat loc (L _ e) [] - = do { p <- checkAPat loc e; return (L loc p) } + = do { pState <- getPState + ; p <- checkAPat (dflags pState) loc e + ; return (L loc p) } checkPat loc _ _ = patFail loc -checkAPat :: SrcSpan -> HsExpr RdrName -> P (Pat RdrName) -checkAPat loc e = case e of +checkAPat :: DynFlags -> SrcSpan -> HsExpr RdrName -> P (Pat RdrName) +checkAPat dynflags loc e = case e of EWildPat -> return (WildPat placeHolderType) HsVar x | isQual x -> parseError loc ("Qualified variable in pattern: " ++ showRdrName x) @@ -761,7 +763,7 @@ checkAPat loc e = case e of -- n+k patterns OpApp (L nloc (HsVar n)) (L _ (HsVar plus)) _ (L _ (HsOverLit lit@(OverLit {ol_val = HsIntegral {}}))) - | plus == plus_RDR + | dopt Opt_NPlusKPatterns dynflags && (plus == plus_RDR) -> return (mkNPlusKPat (L nloc n) lit) OpApp l op _fix r -> do l <- checkLPat l @@ -964,130 +966,63 @@ mkInlineSpec (Just act) match_info inl = Inline (InlinePragma act match_info) ----------------------------------------------------------------------------- -- utilities for foreign declarations --- supported calling conventions --- -data CallConv = CCall CCallConv -- ccall or stdcall - | DNCall -- .NET - -- construct a foreign import declaration -- -mkImport :: CallConv +mkImport :: CCallConv -> Safety -> (Located FastString, Located RdrName, LHsType RdrName) -> P (HsDecl RdrName) -mkImport (CCall cconv) safety (entity, v, ty) +mkImport cconv safety (L loc entity, v, ty) | cconv == PrimCallConv = do - let funcTarget = CFunction (StaticTarget (unLoc entity)) + let funcTarget = CFunction (StaticTarget entity) importSpec = CImport PrimCallConv safety nilFS funcTarget return (ForD (ForeignImport v ty importSpec)) | otherwise = do - importSpec <- parseCImport entity cconv safety v - return (ForD (ForeignImport v ty importSpec)) -mkImport (DNCall ) _ (entity, v, ty) = do - spec <- parseDImport entity - return $ ForD (ForeignImport v ty (DNImport spec)) - --- parse the entity string of a foreign import declaration for the `ccall' or --- `stdcall' calling convention' --- -parseCImport :: Located FastString - -> CCallConv - -> Safety - -> Located RdrName - -> P ForeignImport -parseCImport (L loc entity) cconv safety v - -- FIXME: we should allow white space around `dynamic' and `wrapper' -=chak - | entity == fsLit "dynamic" = - return $ CImport cconv safety nilFS (CFunction DynamicTarget) - | entity == fsLit "wrapper" = - return $ CImport cconv safety nilFS CWrapper - | otherwise = parse0 (unpackFS entity) - where - -- using the static keyword? - parse0 (' ': rest) = parse0 rest - parse0 ('s':'t':'a':'t':'i':'c':rest) = parse1 rest - parse0 rest = parse1 rest - -- check for header file name - parse1 "" = parse4 "" nilFS False - parse1 (' ':rest) = parse1 rest - parse1 str@('&':_ ) = parse2 str nilFS - parse1 str - | ".h" `isSuffixOf` first = parse2 rest (mkFastString first) - | otherwise = parse4 str nilFS False - where - (first, rest) = break (\c -> c == ' ' || c == '&') str - -- check for address operator (indicating a label import) - parse2 "" header = parse4 "" header False - parse2 (' ':rest) header = parse2 rest header - parse2 ('&':rest) header = parse3 rest header - parse2 str header = parse4 str header False - -- eat spaces after '&' - parse3 (' ':rest) header = parse3 rest header - parse3 str header = parse4 str header True - -- check for name of C function - parse4 "" header isLbl = build (mkExtName (unLoc v)) header isLbl - parse4 (' ':rest) header isLbl = parse4 rest header isLbl - parse4 str header isLbl - | all (== ' ') rest = build (mkFastString first) header isLbl - | otherwise = parseError loc "Malformed entity string" - where - (first, rest) = break (== ' ') str - -- - build cid header False = return $ - CImport cconv safety header (CFunction (StaticTarget cid)) - build cid header True = return $ - CImport cconv safety header (CLabel cid ) - --- --- Unravel a dotnet spec string. --- -parseDImport :: Located FastString -> P DNCallSpec -parseDImport (L loc entity) = parse0 comps + case parseCImport cconv safety (mkExtName (unLoc v)) (unpackFS entity) of + Nothing -> parseError loc "Malformed entity string" + Just importSpec -> return (ForD (ForeignImport v ty importSpec)) + +-- the string "foo" is ambigous: either a header or a C identifier. The +-- C identifier case comes first in the alternatives below, so we pick +-- that one. +parseCImport :: CCallConv -> Safety -> FastString -> String + -> Maybe ForeignImport +parseCImport cconv safety nm str = + listToMaybe $ map fst $ filter (null.snd) $ + readP_to_S parse str where - comps = words (unpackFS entity) - - parse0 [] = d'oh - parse0 (x : xs) - | x == "static" = parse1 True xs - | otherwise = parse1 False (x:xs) - - parse1 _ [] = d'oh - parse1 isStatic (x:xs) - | x == "method" = parse2 isStatic DNMethod xs - | x == "field" = parse2 isStatic DNField xs - | x == "ctor" = parse2 isStatic DNConstructor xs - parse1 isStatic xs = parse2 isStatic DNMethod xs - - parse2 _ _ [] = d'oh - parse2 isStatic kind (('[':x):xs) = - case x of - [] -> d'oh - vs | last vs == ']' -> parse3 isStatic kind (init vs) xs - _ -> d'oh - parse2 isStatic kind xs = parse3 isStatic kind "" xs - - parse3 isStatic kind assem [x] = - return (DNCallSpec isStatic kind assem x - -- these will be filled in once known. - (error "FFI-dotnet-args") - (error "FFI-dotnet-result")) - parse3 _ _ _ _ = d'oh - - d'oh = parseError loc "Malformed entity string" - + parse = choice [ + string "dynamic" >> return (mk nilFS (CFunction DynamicTarget)), + string "wrapper" >> return (mk nilFS CWrapper), + optional (string "static" >> skipSpaces) >> + (mk nilFS <$> cimp nm) +++ + (do h <- munch1 hdr_char; skipSpaces; mk (mkFastString h) <$> cimp nm) + ] + + mk = CImport cconv safety + + hdr_char c = isAscii c && (isAlphaNum c || c `elem` "._") + id_char c = isAlphaNum c || c == '_' + + cimp nm = (ReadP.char '&' >> skipSpaces >> CLabel <$> cid) + +++ ((CFunction . StaticTarget) <$> cid) + where + cid = return nm +++ + (do c <- satisfy (\c -> isAlpha c || c == '_') + cs <- many (satisfy id_char) + return (mkFastString (c:cs))) + + -- construct a foreign export declaration -- -mkExport :: CallConv +mkExport :: CCallConv -> (Located FastString, Located RdrName, LHsType RdrName) -> P (HsDecl RdrName) -mkExport (CCall cconv) (L _ entity, v, ty) = return $ +mkExport cconv (L _ entity, v, ty) = return $ ForD (ForeignExport v ty (CExport (CExportStatic entity' cconv))) where entity' | nullFS entity = mkExtName (unLoc v) | otherwise = entity -mkExport DNCall (L _ _, v, _) = - parseError (getLoc v){-TODO: not quite right-} - "Foreign export is not yet supported for .NET" -- Supplying the ext_name in a foreign decl is optional; if it -- isn't there, the Haskell name is assumed. Note that no transformation