module Data.License.Type where

data License =
    MIT
  | ISC

  | BSD2
  | BSD3
  | BSD4

  | GPLv2
  | GPLv3

  | LGPLv2_1
  | LGPLv3

  | AGPLv3

  | MPL_2_0
  | Apache_2_0
  deriving (License -> License -> Bool
(License -> License -> Bool)
-> (License -> License -> Bool) -> Eq License
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: License -> License -> Bool
== :: License -> License -> Bool
$c/= :: License -> License -> Bool
/= :: License -> License -> Bool
Eq, Int -> License -> ShowS
[License] -> ShowS
License -> String
(Int -> License -> ShowS)
-> (License -> String) -> ([License] -> ShowS) -> Show License
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> License -> ShowS
showsPrec :: Int -> License -> ShowS
$cshow :: License -> String
show :: License -> String
$cshowList :: [License] -> ShowS
showList :: [License] -> ShowS
Show, License
License -> License -> Bounded License
forall a. a -> a -> Bounded a
$cminBound :: License
minBound :: License
$cmaxBound :: License
maxBound :: License
Bounded, Int -> License
License -> Int
License -> [License]
License -> License
License -> License -> [License]
License -> License -> License -> [License]
(License -> License)
-> (License -> License)
-> (Int -> License)
-> (License -> Int)
-> (License -> [License])
-> (License -> License -> [License])
-> (License -> License -> [License])
-> (License -> License -> License -> [License])
-> Enum License
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: License -> License
succ :: License -> License
$cpred :: License -> License
pred :: License -> License
$ctoEnum :: Int -> License
toEnum :: Int -> License
$cfromEnum :: License -> Int
fromEnum :: License -> Int
$cenumFrom :: License -> [License]
enumFrom :: License -> [License]
$cenumFromThen :: License -> License -> [License]
enumFromThen :: License -> License -> [License]
$cenumFromTo :: License -> License -> [License]
enumFromTo :: License -> License -> [License]
$cenumFromThenTo :: License -> License -> License -> [License]
enumFromThenTo :: License -> License -> License -> [License]
Enum)