{-# language DerivingStrategies #-}

module FileSystemType where

import HugeTLBOptionsType (HugeTLBOptions)

import Prelude (Show, Eq, Ord, Show)

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