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