module FFICXX.Generate.Type.Annotate where

import qualified Data.Map as M

data PkgType = PkgModule | PkgClass | PkgMethod 
               deriving (Int -> PkgType -> ShowS
[PkgType] -> ShowS
PkgType -> String
(Int -> PkgType -> ShowS)
-> (PkgType -> String) -> ([PkgType] -> ShowS) -> Show PkgType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PkgType] -> ShowS
$cshowList :: [PkgType] -> ShowS
show :: PkgType -> String
$cshow :: PkgType -> String
showsPrec :: Int -> PkgType -> ShowS
$cshowsPrec :: Int -> PkgType -> ShowS
Show,PkgType -> PkgType -> Bool
(PkgType -> PkgType -> Bool)
-> (PkgType -> PkgType -> Bool) -> Eq PkgType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PkgType -> PkgType -> Bool
$c/= :: PkgType -> PkgType -> Bool
== :: PkgType -> PkgType -> Bool
$c== :: PkgType -> PkgType -> Bool
Eq,Eq PkgType
Eq PkgType
-> (PkgType -> PkgType -> Ordering)
-> (PkgType -> PkgType -> Bool)
-> (PkgType -> PkgType -> Bool)
-> (PkgType -> PkgType -> Bool)
-> (PkgType -> PkgType -> Bool)
-> (PkgType -> PkgType -> PkgType)
-> (PkgType -> PkgType -> PkgType)
-> Ord PkgType
PkgType -> PkgType -> Bool
PkgType -> PkgType -> Ordering
PkgType -> PkgType -> PkgType
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
min :: PkgType -> PkgType -> PkgType
$cmin :: PkgType -> PkgType -> PkgType
max :: PkgType -> PkgType -> PkgType
$cmax :: PkgType -> PkgType -> PkgType
>= :: PkgType -> PkgType -> Bool
$c>= :: PkgType -> PkgType -> Bool
> :: PkgType -> PkgType -> Bool
$c> :: PkgType -> PkgType -> Bool
<= :: PkgType -> PkgType -> Bool
$c<= :: PkgType -> PkgType -> Bool
< :: PkgType -> PkgType -> Bool
$c< :: PkgType -> PkgType -> Bool
compare :: PkgType -> PkgType -> Ordering
$ccompare :: PkgType -> PkgType -> Ordering
$cp1Ord :: Eq PkgType
Ord)

type AnnotateMap = M.Map (PkgType,String) String