Cabal-syntax-3.16.0.0: A library for working with .cabal files
CopyrightDuncan Coutts 2008
LicenseBSD3
Maintainercabal-devel@haskell.org
Portabilityportable
Safe HaskellNone
LanguageHaskell2010

Distribution.ModuleName

Contents

Description

Data type for Haskell module names.

Documentation

data ModuleName Source #

A valid Haskell module name.

Instances

Instances details
Instance details

Defined in Distribution.ModuleName

Instance details

Defined in Distribution.ModuleName

Instance details

Defined in Distribution.ModuleName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleName -> c ModuleName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleName #

toConstr :: ModuleName -> Constr #

dataTypeOf :: ModuleName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleName) #

gmapT :: (forall b. Data b => b -> b) -> ModuleName -> ModuleName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName #

IsString ModuleName Source #

Construct a ModuleName from a valid module name String .

This is just a convenience function intended for valid module strings. It is an error if it is used with a string that is not a valid module name. If you are parsing user input then use simpleParse instead.

Instance details

Defined in Distribution.ModuleName

Instance details

Defined in Distribution.ModuleName

Associated Types

Instance details

Defined in Distribution.ModuleName

type Rep ModuleName = D1 ('MetaData "ModuleName" "Distribution.ModuleName" "Cabal-syntax-3.16.0.0-813lolNablNGaeNilk6GeH" 'True) (C1 ('MetaCons "ModuleName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))
Read ModuleName Source #
Instance details

Defined in Distribution.ModuleName

Show ModuleName Source #
Instance details

Defined in Distribution.ModuleName

Binary ModuleName Source #
Instance details

Defined in Distribution.ModuleName

NFData ModuleName Source #
Instance details

Defined in Distribution.ModuleName

Methods

rnf :: ModuleName -> () #

Eq ModuleName Source #
Instance details

Defined in Distribution.ModuleName

Ord ModuleName Source #
Instance details

Defined in Distribution.ModuleName

type Rep ModuleName Source #
Instance details

Defined in Distribution.ModuleName

type Rep ModuleName = D1 ('MetaData "ModuleName" "Distribution.ModuleName" "Cabal-syntax-3.16.0.0-813lolNablNGaeNilk6GeH" 'True) (C1 ('MetaCons "ModuleName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

fromString :: IsString a => String -> a #

fromComponents :: [String] -> ModuleName Source #

Deprecated: Exists for cabal-install only

Construct a ModuleName from valid module components, i.e. parts separated by dots.

components :: ModuleName -> [String] Source #

The individual components of a hierarchical module name. For example

components (fromString "A.B.C") = ["A", "B", "C"]

toFilePath :: ModuleName -> FilePath Source #

Convert a module name to a file path, but without any file extension. For example:

toFilePath (fromString "A.B.C") = "A/B/C"

main :: ModuleName Source #

The module name Main.

Internal

validModuleComponent :: String -> Bool Source #

AltStyle によって変換されたページ (->オリジナル) /