module Memfd.FileSystemType where import Memfd.HugeTLBOptionsType (HugeTLBOptions) import Prelude (Show, Eq, Ord, Show) data FileSystem = TemporaryFileSystem | HugeTLBFileSystem HugeTLBOptions deriving stock (FileSystem -> FileSystem -> Bool 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 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 Ord, Int -> FileSystem -> ShowS [FileSystem] -> ShowS FileSystem -> String 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)