| Safe Haskell | None | 
|---|---|
| Language | Haskell98 | 
Language.PureScript.Sugar.Names.Env
- data ImportRecord a = ImportRecord {}
- data ImportProvenance
- data Imports = Imports {- importedTypes :: ImportMap (ProperName TypeName)
- importedTypeOps :: ImportMap (OpName TypeOpName)
- importedDataConstructors :: ImportMap (ProperName ConstructorName)
- importedTypeClasses :: ImportMap (ProperName ClassName)
- importedValues :: ImportMap Ident
- importedValueOps :: ImportMap (OpName ValueOpName)
- importedModules :: Set ModuleName
- importedQualModules :: Set ModuleName
- importedKinds :: ImportMap (ProperName KindName)
 
- primImports :: Imports
- data Exports = Exports {- exportedTypes :: Map (ProperName TypeName) ([ProperName ConstructorName], ModuleName)
- exportedTypeOps :: Map (OpName TypeOpName) ModuleName
- exportedTypeClasses :: Map (ProperName ClassName) ModuleName
- exportedValues :: Map Ident ModuleName
- exportedValueOps :: Map (OpName ValueOpName) ModuleName
- exportedKinds :: Map (ProperName KindName) ModuleName
 
- nullExports :: Exports
- type Env = Map ModuleName (SourceSpan, Imports, Exports)
- primEnv :: Env
- envModuleSourceSpan :: (SourceSpan, a, b) -> SourceSpan
- envModuleImports :: (a, Imports, b) -> Imports
- envModuleExports :: (a, b, Exports) -> Exports
- data ExportMode
- exportType :: MonadError MultipleErrors m => ExportMode -> Exports -> ProperName TypeName -> [ProperName ConstructorName] -> ModuleName -> m Exports
- exportTypeOp :: MonadError MultipleErrors m => Exports -> OpName TypeOpName -> ModuleName -> m Exports
- exportTypeClass :: MonadError MultipleErrors m => ExportMode -> Exports -> ProperName ClassName -> ModuleName -> m Exports
- exportValue :: MonadError MultipleErrors m => Exports -> Ident -> ModuleName -> m Exports
- exportValueOp :: MonadError MultipleErrors m => Exports -> OpName ValueOpName -> ModuleName -> m Exports
- exportKind :: MonadError MultipleErrors m => Exports -> ProperName KindName -> ModuleName -> m Exports
- getExports :: MonadError MultipleErrors m => Env -> ModuleName -> m Exports
- checkImportConflicts :: forall m a. (MonadError MultipleErrors m, MonadWriter MultipleErrors m) => ModuleName -> (a -> Name) -> [ImportRecord a] -> m (ModuleName, ModuleName)
Documentation
data ImportRecord a Source #
The details for an import: the name of the thing that is being imported
 (x if importing from A), the module that the thing was originally
 defined in (for re-export resolution), and the import provenance (see below).
Constructors
| ImportRecord | |
| Fields | |
Instances
| Eq a => Eq (ImportRecord a) Source # | |
| Ord a => Ord (ImportRecord a) Source # | |
| Show a => Show (ImportRecord a) Source # | |
data ImportProvenance Source #
Used to track how an import was introduced into scope. This allows us to handle the one-open-import special case that allows a name conflict to become a warning rather than being an unresolvable situation.
Constructors
| FromImplicit | |
| FromExplicit | |
| Local | |
| Prim | 
Instances
The imported declarations for a module, including the module's own members.
Constructors
| Imports | |
| Fields 
 | |
The exported declarations from a module.
Constructors
| Exports | |
| Fields 
 | |
nullExports :: Exports Source #
An empty Exports value.
type Env = Map ModuleName (SourceSpan, Imports, Exports) Source #
The imports and exports for a collection of modules. The SourceSpan is used
 to store the source location of the module with a given name, used to provide
 useful information when there is a duplicate module definition.
envModuleSourceSpan :: (SourceSpan, a, b) -> SourceSpan Source #
Extracts the SourceSpan from an Env value.
data ExportMode Source #
When updating the Exports the behaviour is slightly different depending
 on whether we are exporting values defined within the module or elaborating
 re-exported values. This type is used to indicate which behaviour should be
 used.
Instances
exportType :: MonadError MultipleErrors m => ExportMode -> Exports -> ProperName TypeName -> [ProperName ConstructorName] -> ModuleName -> m Exports Source #
Safely adds a type and its data constructors to some exports, returning an error if a conflict occurs.
exportTypeOp :: MonadError MultipleErrors m => Exports -> OpName TypeOpName -> ModuleName -> m Exports Source #
Safely adds a type operator to some exports, returning an error if a conflict occurs.
exportTypeClass :: MonadError MultipleErrors m => ExportMode -> Exports -> ProperName ClassName -> ModuleName -> m Exports Source #
Safely adds a class to some exports, returning an error if a conflict occurs.
exportValue :: MonadError MultipleErrors m => Exports -> Ident -> ModuleName -> m Exports Source #
Safely adds a value to some exports, returning an error if a conflict occurs.
exportValueOp :: MonadError MultipleErrors m => Exports -> OpName ValueOpName -> ModuleName -> m Exports Source #
Safely adds a value operator to some exports, returning an error if a conflict occurs.
exportKind :: MonadError MultipleErrors m => Exports -> ProperName KindName -> ModuleName -> m Exports Source #
Safely adds a kind to some exports, returning an error if a conflict occurs.
getExports :: MonadError MultipleErrors m => Env -> ModuleName -> m Exports Source #
Gets the exports for a module, or raise an error if the module doesn't exist.
checkImportConflicts :: forall m a. (MonadError MultipleErrors m, MonadWriter MultipleErrors m) => ModuleName -> (a -> Name) -> [ImportRecord a] -> m (ModuleName, ModuleName) Source #
When reading a value from the imports, check that there are no conflicts in scope.