{-# LANGUAGE NoImplicitPrelude #-}

module DSV.ParseStop
  ( ParseStop (..)
  ) where

import DSV.Prelude

data ParseStop
  = ParseComplete
  | ParseIncomplete
  deriving (ParseStop -> ParseStop -> Bool
(ParseStop -> ParseStop -> Bool)
-> (ParseStop -> ParseStop -> Bool) -> Eq ParseStop
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ParseStop -> ParseStop -> Bool
$c/= :: ParseStop -> ParseStop -> Bool
== :: ParseStop -> ParseStop -> Bool
$c== :: ParseStop -> ParseStop -> Bool
Eq, Int -> ParseStop -> ShowS
[ParseStop] -> ShowS
ParseStop -> String
(Int -> ParseStop -> ShowS)
-> (ParseStop -> String)
-> ([ParseStop] -> ShowS)
-> Show ParseStop
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ParseStop] -> ShowS
$cshowList :: [ParseStop] -> ShowS
show :: ParseStop -> String
$cshow :: ParseStop -> String
showsPrec :: Int -> ParseStop -> ShowS
$cshowsPrec :: Int -> ParseStop -> ShowS
Show)