module Hydra.Langs.Protobuf.SourceContext where
import qualified Hydra.Core as Core
import Data.Int
import Data.List as L
import Data.Map as M
import Data.Set as S
data SourceContext =
SourceContext {
SourceContext -> String
sourceContextFileName :: String}
deriving (SourceContext -> SourceContext -> Bool
(SourceContext -> SourceContext -> Bool)
-> (SourceContext -> SourceContext -> Bool) -> Eq SourceContext
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SourceContext -> SourceContext -> Bool
== :: SourceContext -> SourceContext -> Bool
$c/= :: SourceContext -> SourceContext -> Bool
/= :: SourceContext -> SourceContext -> Bool
Eq, Eq SourceContext
Eq SourceContext =>
(SourceContext -> SourceContext -> Ordering)
-> (SourceContext -> SourceContext -> Bool)
-> (SourceContext -> SourceContext -> Bool)
-> (SourceContext -> SourceContext -> Bool)
-> (SourceContext -> SourceContext -> Bool)
-> (SourceContext -> SourceContext -> SourceContext)
-> (SourceContext -> SourceContext -> SourceContext)
-> Ord SourceContext
SourceContext -> SourceContext -> Bool
SourceContext -> SourceContext -> Ordering
SourceContext -> SourceContext -> SourceContext
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: SourceContext -> SourceContext -> Ordering
compare :: SourceContext -> SourceContext -> Ordering
$c< :: SourceContext -> SourceContext -> Bool
< :: SourceContext -> SourceContext -> Bool
$c<= :: SourceContext -> SourceContext -> Bool
<= :: SourceContext -> SourceContext -> Bool
$c> :: SourceContext -> SourceContext -> Bool
> :: SourceContext -> SourceContext -> Bool
$c>= :: SourceContext -> SourceContext -> Bool
>= :: SourceContext -> SourceContext -> Bool
$cmax :: SourceContext -> SourceContext -> SourceContext
max :: SourceContext -> SourceContext -> SourceContext
$cmin :: SourceContext -> SourceContext -> SourceContext
min :: SourceContext -> SourceContext -> SourceContext
Ord, ReadPrec [SourceContext]
ReadPrec SourceContext
Int -> ReadS SourceContext
ReadS [SourceContext]
(Int -> ReadS SourceContext)
-> ReadS [SourceContext]
-> ReadPrec SourceContext
-> ReadPrec [SourceContext]
-> Read SourceContext
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS SourceContext
readsPrec :: Int -> ReadS SourceContext
$creadList :: ReadS [SourceContext]
readList :: ReadS [SourceContext]
$creadPrec :: ReadPrec SourceContext
readPrec :: ReadPrec SourceContext
$creadListPrec :: ReadPrec [SourceContext]
readListPrec :: ReadPrec [SourceContext]
Read, Int -> SourceContext -> ShowS
[SourceContext] -> ShowS
SourceContext -> String
(Int -> SourceContext -> ShowS)
-> (SourceContext -> String)
-> ([SourceContext] -> ShowS)
-> Show SourceContext
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SourceContext -> ShowS
showsPrec :: Int -> SourceContext -> ShowS
$cshow :: SourceContext -> String
show :: SourceContext -> String
$cshowList :: [SourceContext] -> ShowS
showList :: [SourceContext] -> ShowS
Show)
_SourceContext :: Name
_SourceContext = (String -> Name
Core.Name String
"hydra/langs/protobuf/sourceContext.SourceContext")
_SourceContext_fileName :: Name
_SourceContext_fileName = (String -> Name
Core.Name String
"fileName")