module Conllu.DeprelTagset where
data EP
= REF
| ACL
| ADVCL
| ADVMOD
| AMOD
| APPOS
| AUX
| CASE
| CCOMP
| CC
| CLF
| COMPOUND
| CONJ
| COP
| CSUBJ
| DEP
| DET
| DISCOURSE
| DISLOCATED
| EXPL
| FIXED
| FLAT
| GOESWITH
| IOBJ
| LIST
| MARK
| NMOD
| NSUBJ
| NUMMOD
| OBJ
| OBL
| ORPHAN
| PARATAXIS
| PUNCT
| REPARANDUM
| ROOT
| VOCATIVE
| XCOMP
deriving (Int -> EP
EP -> Int
EP -> [EP]
EP -> EP
EP -> EP -> [EP]
EP -> EP -> EP -> [EP]
(EP -> EP)
-> (EP -> EP)
-> (Int -> EP)
-> (EP -> Int)
-> (EP -> [EP])
-> (EP -> EP -> [EP])
-> (EP -> EP -> [EP])
-> (EP -> EP -> EP -> [EP])
-> Enum EP
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: EP -> EP -> EP -> [EP]
$cenumFromThenTo :: EP -> EP -> EP -> [EP]
enumFromTo :: EP -> EP -> [EP]
$cenumFromTo :: EP -> EP -> [EP]
enumFromThen :: EP -> EP -> [EP]
$cenumFromThen :: EP -> EP -> [EP]
enumFrom :: EP -> [EP]
$cenumFrom :: EP -> [EP]
fromEnum :: EP -> Int
$cfromEnum :: EP -> Int
toEnum :: Int -> EP
$ctoEnum :: Int -> EP
pred :: EP -> EP
$cpred :: EP -> EP
succ :: EP -> EP
$csucc :: EP -> EP
Enum, EP -> EP -> Bool
(EP -> EP -> Bool) -> (EP -> EP -> Bool) -> Eq EP
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EP -> EP -> Bool
$c/= :: EP -> EP -> Bool
== :: EP -> EP -> Bool
$c== :: EP -> EP -> Bool
Eq, ReadPrec [EP]
ReadPrec EP
Int -> ReadS EP
ReadS [EP]
(Int -> ReadS EP)
-> ReadS [EP] -> ReadPrec EP -> ReadPrec [EP] -> Read EP
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [EP]
$creadListPrec :: ReadPrec [EP]
readPrec :: ReadPrec EP
$creadPrec :: ReadPrec EP
readList :: ReadS [EP]
$creadList :: ReadS [EP]
readsPrec :: Int -> ReadS EP
$creadsPrec :: Int -> ReadS EP
Read, Int -> EP -> ShowS
[EP] -> ShowS
EP -> String
(Int -> EP -> ShowS)
-> (EP -> String) -> ([EP] -> ShowS) -> Show EP
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [EP] -> ShowS
$cshowList :: [EP] -> ShowS
show :: EP -> String
$cshow :: EP -> String
showsPrec :: Int -> EP -> ShowS
$cshowsPrec :: Int -> EP -> ShowS
Show)