Distribution.Types.Executable.Lens
data Executable Source #
Defined in Distribution.Types.Executable
Methods
buildInfo :: Lens' Executable BuildInfo Source #
buildable :: Lens' Executable Bool Source #
buildTools :: Lens' Executable [LegacyExeDependency] Source #
buildToolDepends :: Lens' Executable [ExeDependency] Source #
cppOptions :: Lens' Executable [String] Source #
asmOptions :: Lens' Executable [String] Source #
cmmOptions :: Lens' Executable [String] Source #
ccOptions :: Lens' Executable [String] Source #
cxxOptions :: Lens' Executable [String] Source #
ldOptions :: Lens' Executable [String] Source #
hsc2hsOptions :: Lens' Executable [String] Source #
pkgconfigDepends :: Lens' Executable [PkgconfigDependency] Source #
frameworks :: Lens' Executable [RelativePath Framework 'File] Source #
extraFrameworkDirs :: Lens' Executable [SymbolicPath Pkg ('Dir Framework)] Source #
asmSources :: Lens' Executable [SymbolicPath Pkg 'File] Source #
cmmSources :: Lens' Executable [SymbolicPath Pkg 'File] Source #
cSources :: Lens' Executable [SymbolicPath Pkg 'File] Source #
cxxSources :: Lens' Executable [SymbolicPath Pkg 'File] Source #
jsSources :: Lens' Executable [SymbolicPath Pkg 'File] Source #
hsSourceDirs :: Lens' Executable [SymbolicPath Pkg ('Dir Source)] Source #
otherModules :: Lens' Executable [ModuleName] Source #
virtualModules :: Lens' Executable [ModuleName] Source #
autogenModules :: Lens' Executable [ModuleName] Source #
defaultLanguage :: Lens' Executable (Maybe Language) Source #
otherLanguages :: Lens' Executable [Language] Source #
defaultExtensions :: Lens' Executable [Extension] Source #
otherExtensions :: Lens' Executable [Extension] Source #
oldExtensions :: Lens' Executable [Extension] Source #
extraLibs :: Lens' Executable [String] Source #
extraLibsStatic :: Lens' Executable [String] Source #
extraGHCiLibs :: Lens' Executable [String] Source #
extraBundledLibs :: Lens' Executable [String] Source #
extraLibFlavours :: Lens' Executable [String] Source #
extraDynLibFlavours :: Lens' Executable [String] Source #
extraLibDirs :: Lens' Executable [SymbolicPath Pkg ('Dir Lib)] Source #
extraLibDirsStatic :: Lens' Executable [SymbolicPath Pkg ('Dir Lib)] Source #
includeDirs :: Lens' Executable [SymbolicPath Pkg ('Dir Include)] Source #
includes :: Lens' Executable [SymbolicPath Include 'File] Source #
autogenIncludes :: Lens' Executable [RelativePath Include 'File] Source #
installIncludes :: Lens' Executable [RelativePath Include 'File] Source #
options :: Lens' Executable (PerCompilerFlavor [String]) Source #
profOptions :: Lens' Executable (PerCompilerFlavor [String]) Source #
sharedOptions :: Lens' Executable (PerCompilerFlavor [String]) Source #
profSharedOptions :: Lens' Executable (PerCompilerFlavor [String]) Source #
staticOptions :: Lens' Executable (PerCompilerFlavor [String]) Source #
customFieldsBI :: Lens' Executable [(String, String)] Source #
targetBuildDepends :: Lens' Executable [Dependency] Source #
mixins :: Lens' Executable [Mixin] Source #
structure :: Proxy Executable -> Structure Source #
structureHash' :: Tagged Executable MD5
put :: Executable -> Put Source #
get :: Get Executable Source #
putList :: [Executable] -> Put Source #
rnf :: Executable -> () Source #
mempty :: Executable #
mappend :: Executable -> Executable -> Executable #
mconcat :: [Executable] -> Executable #
(<>) :: Executable -> Executable -> Executable #
sconcat :: NonEmpty Executable -> Executable #
stimes :: Integral b => b -> Executable -> Executable #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Executable -> c Executable #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Executable #
toConstr :: Executable -> Constr #
dataTypeOf :: Executable -> DataType #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Executable) #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Executable) #
gmapT :: (forall b. Data b => b -> b) -> Executable -> Executable #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Executable -> r #
gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Executable -> r #
gmapQ :: (forall d. Data d => d -> u) -> Executable -> [u] #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Executable -> u #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Executable -> m Executable #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Executable -> m Executable #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Executable -> m Executable #
Associated Types
from :: Executable -> Rep Executable x #
to :: Rep Executable x -> Executable #
readsPrec :: Int -> ReadS Executable #
readList :: ReadS [Executable] #
readPrec :: ReadPrec Executable #
readListPrec :: ReadPrec [Executable] #
showsPrec :: Int -> Executable -> ShowS #
show :: Executable -> String #
showList :: [Executable] -> ShowS #
(==) :: Executable -> Executable -> Bool #
(/=) :: Executable -> Executable -> Bool #
compare :: Executable -> Executable -> Ordering #
(<) :: Executable -> Executable -> Bool #
(<=) :: Executable -> Executable -> Bool #
(>) :: Executable -> Executable -> Bool #
(>=) :: Executable -> Executable -> Bool #
max :: Executable -> Executable -> Executable #
min :: Executable -> Executable -> Executable #
exeBuildInfo :: Lens' Executable BuildInfo Source #
exeName :: Lens' Executable UnqualComponentName Source #
exeScope :: Lens' Executable ExecutableScope Source #
modulePath :: Lens' Executable (RelativePath Source 'File) Source #