Cabal-2.4.0.0: A framework for packaging Haskell software
Distribution.Types.Benchmark.Lens
data Benchmark #
A "benchmark" stanza in a cabal file.
Defined in Distribution.Types.Benchmark
Methods
(==) :: Benchmark -> Benchmark -> Bool #
(/=) :: Benchmark -> Benchmark -> Bool #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Benchmark -> c Benchmark #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Benchmark #
toConstr :: Benchmark -> Constr #
dataTypeOf :: Benchmark -> DataType #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Benchmark) #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Benchmark) #
gmapT :: (forall b. Data b => b -> b) -> Benchmark -> Benchmark #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Benchmark -> r #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Benchmark -> r #
gmapQ :: (forall d. Data d => d -> u) -> Benchmark -> [u] #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Benchmark -> u #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark #
readsPrec :: Int -> ReadS Benchmark #
readList :: ReadS [Benchmark] #
readPrec :: ReadPrec Benchmark #
readListPrec :: ReadPrec [Benchmark] #
showsPrec :: Int -> Benchmark -> ShowS #
show :: Benchmark -> String #
showList :: [Benchmark] -> ShowS #
Associated Types
type Rep Benchmark :: * -> * #
from :: Benchmark -> Rep Benchmark x #
to :: Rep Benchmark x -> Benchmark #
(<>) :: Benchmark -> Benchmark -> Benchmark #
sconcat :: NonEmpty Benchmark -> Benchmark #
stimes :: Integral b => b -> Benchmark -> Benchmark #
mempty :: Benchmark #
mappend :: Benchmark -> Benchmark -> Benchmark #
mconcat :: [Benchmark] -> Benchmark #
put :: Benchmark -> Put #
get :: Get Benchmark #
putList :: [Benchmark] -> Put #
rnf :: Benchmark -> () #
buildInfo :: Lens' Benchmark BuildInfo #
buildable :: Lens' Benchmark Bool #
buildTools :: Lens' Benchmark [LegacyExeDependency] #
buildToolDepends :: Lens' Benchmark [ExeDependency] #
cppOptions :: Lens' Benchmark [String] #
asmOptions :: Lens' Benchmark [String] #
cmmOptions :: Lens' Benchmark [String] #
ccOptions :: Lens' Benchmark [String] #
cxxOptions :: Lens' Benchmark [String] #
ldOptions :: Lens' Benchmark [String] #
pkgconfigDepends :: Lens' Benchmark [PkgconfigDependency] #
frameworks :: Lens' Benchmark [String] #
extraFrameworkDirs :: Lens' Benchmark [String] #
asmSources :: Lens' Benchmark [FilePath] #
cmmSources :: Lens' Benchmark [FilePath] #
cSources :: Lens' Benchmark [FilePath] #
cxxSources :: Lens' Benchmark [FilePath] #
jsSources :: Lens' Benchmark [FilePath] #
hsSourceDirs :: Lens' Benchmark [FilePath] #
otherModules :: Lens' Benchmark [ModuleName] #
virtualModules :: Lens' Benchmark [ModuleName] #
autogenModules :: Lens' Benchmark [ModuleName] #
defaultLanguage :: Lens' Benchmark (Maybe Language) #
otherLanguages :: Lens' Benchmark [Language] #
defaultExtensions :: Lens' Benchmark [Extension] #
otherExtensions :: Lens' Benchmark [Extension] #
oldExtensions :: Lens' Benchmark [Extension] #
extraLibs :: Lens' Benchmark [String] #
extraGHCiLibs :: Lens' Benchmark [String] #
extraBundledLibs :: Lens' Benchmark [String] #
extraLibFlavours :: Lens' Benchmark [String] #
extraLibDirs :: Lens' Benchmark [String] #
includeDirs :: Lens' Benchmark [FilePath] #
includes :: Lens' Benchmark [FilePath] #
installIncludes :: Lens' Benchmark [FilePath] #
options :: Lens' Benchmark [(CompilerFlavor, [String])] #
profOptions :: Lens' Benchmark [(CompilerFlavor, [String])] #
sharedOptions :: Lens' Benchmark [(CompilerFlavor, [String])] #
staticOptions :: Lens' Benchmark [(CompilerFlavor, [String])] #
customFieldsBI :: Lens' Benchmark [(String, String)] #
targetBuildDepends :: Lens' Benchmark [Dependency] #
mixins :: Lens' Benchmark [Mixin] #
benchmarkName :: Lens' Benchmark UnqualComponentName #
benchmarkInterface :: Lens' Benchmark BenchmarkInterface #
benchmarkBuildInfo :: Lens' Benchmark BuildInfo #