Distribution.Types.Library.Lens
data Library Source #
Defined in Distribution.Types.Library
Methods
buildInfo :: Lens' Library BuildInfo Source #
buildable :: Lens' Library Bool Source #
buildTools :: Lens' Library [LegacyExeDependency] Source #
buildToolDepends :: Lens' Library [ExeDependency] Source #
cppOptions :: Lens' Library [String] Source #
asmOptions :: Lens' Library [String] Source #
cmmOptions :: Lens' Library [String] Source #
ccOptions :: Lens' Library [String] Source #
cxxOptions :: Lens' Library [String] Source #
ldOptions :: Lens' Library [String] Source #
hsc2hsOptions :: Lens' Library [String] Source #
pkgconfigDepends :: Lens' Library [PkgconfigDependency] Source #
frameworks :: Lens' Library [RelativePath Framework 'File] Source #
extraFrameworkDirs :: Lens' Library [SymbolicPath Pkg ('Dir Framework)] Source #
asmSources :: Lens' Library [SymbolicPath Pkg 'File] Source #
cmmSources :: Lens' Library [SymbolicPath Pkg 'File] Source #
cSources :: Lens' Library [SymbolicPath Pkg 'File] Source #
cxxSources :: Lens' Library [SymbolicPath Pkg 'File] Source #
jsSources :: Lens' Library [SymbolicPath Pkg 'File] Source #
hsSourceDirs :: Lens' Library [SymbolicPath Pkg ('Dir Source)] Source #
otherModules :: Lens' Library [ModuleName] Source #
virtualModules :: Lens' Library [ModuleName] Source #
autogenModules :: Lens' Library [ModuleName] Source #
defaultLanguage :: Lens' Library (Maybe Language) Source #
otherLanguages :: Lens' Library [Language] Source #
defaultExtensions :: Lens' Library [Extension] Source #
otherExtensions :: Lens' Library [Extension] Source #
oldExtensions :: Lens' Library [Extension] Source #
extraLibs :: Lens' Library [String] Source #
extraLibsStatic :: Lens' Library [String] Source #
extraGHCiLibs :: Lens' Library [String] Source #
extraBundledLibs :: Lens' Library [String] Source #
extraLibFlavours :: Lens' Library [String] Source #
extraDynLibFlavours :: Lens' Library [String] Source #
extraLibDirs :: Lens' Library [SymbolicPath Pkg ('Dir Lib)] Source #
extraLibDirsStatic :: Lens' Library [SymbolicPath Pkg ('Dir Lib)] Source #
includeDirs :: Lens' Library [SymbolicPath Pkg ('Dir Include)] Source #
includes :: Lens' Library [SymbolicPath Include 'File] Source #
autogenIncludes :: Lens' Library [RelativePath Include 'File] Source #
installIncludes :: Lens' Library [RelativePath Include 'File] Source #
options :: Lens' Library (PerCompilerFlavor [String]) Source #
profOptions :: Lens' Library (PerCompilerFlavor [String]) Source #
sharedOptions :: Lens' Library (PerCompilerFlavor [String]) Source #
profSharedOptions :: Lens' Library (PerCompilerFlavor [String]) Source #
staticOptions :: Lens' Library (PerCompilerFlavor [String]) Source #
customFieldsBI :: Lens' Library [(String, String)] Source #
targetBuildDepends :: Lens' Library [Dependency] Source #
mixins :: Lens' Library [Mixin] Source #
structure :: Proxy Library -> Structure Source #
structureHash' :: Tagged Library MD5
put :: Library -> Put Source #
get :: Get Library Source #
putList :: [Library] -> Put Source #
rnf :: Library -> () Source #
This instance is not good.
We need it for addBuildableCondition. More correct method would be some kind of "create empty clone".
addBuildableCondition
More concretely, addBuildableCondition will make `libVisibility = False` libraries when `buildable: false`. This may cause problems.
mempty :: Library #
mappend :: Library -> Library -> Library #
mconcat :: [Library] -> Library #
(<>) :: Library -> Library -> Library #
sconcat :: NonEmpty Library -> Library #
stimes :: Integral b => b -> Library -> Library #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Library -> c Library #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Library #
toConstr :: Library -> Constr #
dataTypeOf :: Library -> DataType #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Library) #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Library) #
gmapT :: (forall b. Data b => b -> b) -> Library -> Library #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Library -> r #
gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Library -> r #
gmapQ :: (forall d. Data d => d -> u) -> Library -> [u] #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Library -> u #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Library -> m Library #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Library -> m Library #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Library -> m Library #
Associated Types
from :: Library -> Rep Library x #
to :: Rep Library x -> Library #
readsPrec :: Int -> ReadS Library #
readList :: ReadS [Library] #
readPrec :: ReadPrec Library #
readListPrec :: ReadPrec [Library] #
showsPrec :: Int -> Library -> ShowS #
show :: Library -> String #
showList :: [Library] -> ShowS #
(==) :: Library -> Library -> Bool #
(/=) :: Library -> Library -> Bool #
compare :: Library -> Library -> Ordering #
(<) :: Library -> Library -> Bool #
(<=) :: Library -> Library -> Bool #
(>) :: Library -> Library -> Bool #
(>=) :: Library -> Library -> Bool #
max :: Library -> Library -> Library #
min :: Library -> Library -> Library #
exposedModules :: Lens' Library [ModuleName] Source #
libBuildInfo :: Lens' Library BuildInfo Source #
libExposed :: Lens' Library Bool Source #
libName :: Lens' Library LibraryName Source #
libVisibility :: Lens' Library LibraryVisibility Source #
reexportedModules :: Lens' Library [ModuleReexport] Source #
signatures :: Lens' Library [ModuleName] Source #