module SynCompInterface (EmacsDataItem(..)) where

data EmacsDataItem =
    LexError              -- Lex error at some terminal (not $)
  | ParseError [String]   -- Parse error at some terminal (not $)
  | Candidate String      -- Parse error at the cursor position returning a candidate string 
  | SuccessfullyParsed    -- Successfully parsed until the cursor position
  deriving (EmacsDataItem -> EmacsDataItem -> Bool
(EmacsDataItem -> EmacsDataItem -> Bool)
-> (EmacsDataItem -> EmacsDataItem -> Bool) -> Eq EmacsDataItem
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EmacsDataItem -> EmacsDataItem -> Bool
$c/= :: EmacsDataItem -> EmacsDataItem -> Bool
== :: EmacsDataItem -> EmacsDataItem -> Bool
$c== :: EmacsDataItem -> EmacsDataItem -> Bool
Eq, Int -> EmacsDataItem -> ShowS
[EmacsDataItem] -> ShowS
EmacsDataItem -> String
(Int -> EmacsDataItem -> ShowS)
-> (EmacsDataItem -> String)
-> ([EmacsDataItem] -> ShowS)
-> Show EmacsDataItem
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [EmacsDataItem] -> ShowS
$cshowList :: [EmacsDataItem] -> ShowS
show :: EmacsDataItem -> String
$cshow :: EmacsDataItem -> String
showsPrec :: Int -> EmacsDataItem -> ShowS
$cshowsPrec :: Int -> EmacsDataItem -> ShowS
Show)