Agda-2.4.0.2: A dependently typed functional programming language and proof assistant

Safe HaskellNone
LanguageHaskell98

Agda.Syntax.Scope.Monad

Contents

Description

The scope monad with operations.

Synopsis

The scope checking monad

type ScopeM = TCM Source

To simplify interaction between scope checking and type checking (in particular when chasing imports), we use the same monad.

Errors

General operations

createModule :: Bool -> ModuleName -> ScopeM () Source

Create a new module with an empty scope (Bool is True if it is a datatype module)

modifyScopeInfo :: (ScopeInfo -> ScopeInfo) -> ScopeM () Source

Apply a function to the scope info.

modifyScopes :: (Map ModuleName Scope -> Map ModuleName Scope) -> ScopeM () Source

Apply a function to the scope map.

modifyNamedScope :: ModuleName -> (Scope -> Scope) -> ScopeM () Source

Apply a function to the given scope.

modifyCurrentScope :: (Scope -> Scope) -> ScopeM () Source

Apply a function to the current scope.

modifyNamedScopeM :: ModuleName -> (Scope -> ScopeM Scope) -> ScopeM () Source

Apply a monadic function to the top scope.

modifyCurrentNameSpace :: NameSpaceId -> (NameSpace -> NameSpace) -> ScopeM () Source

Apply a function to the public or private name space.

withLocalVars :: ScopeM a -> ScopeM a Source

Run a computation without changing the local variables.

Names

freshAbstractName :: Fixity' -> Name -> ScopeM Name Source

Create a fresh abstract name from a concrete name.

This function is used when we translate a concrete name in a binder. The Range of the concrete name is saved as the nameBindingSite of the abstract name.

freshAbstractName_ :: Name -> ScopeM Name Source

freshAbstractName_ = freshAbstractName defaultFixity

freshAbstractQName :: Fixity' -> Name -> ScopeM QName Source

Create a fresh abstract qualified name.

Resolving names

data ResolvedName Source

Constructors

VarName Name 
DefinedName Access AbstractName 
FieldName AbstractName

record fields names need to be distinguished to parse copatterns

ConstructorName [AbstractName] 
PatternSynResName AbstractName 
UnknownName 

Instances

resolveName :: QName -> ScopeM ResolvedName Source

Look up the abstract name referred to by a given concrete name.

resolveName' :: [KindOfName] -> QName -> ScopeM ResolvedName Source

Look up the abstract name corresponding to a concrete name of a certain kind. Sometimes we know already that we are dealing with a constructor or pattern synonym (e.g. when we have parsed a pattern). Then, we can ignore conflicting definitions of that name of a different kind. (See issue 822.)

resolveModule :: QName -> ScopeM AbstractModule Source

Look up a module in the scope.

getFixity :: QName -> ScopeM Fixity' Source

Get the fixity of a name. The name is assumed to be in scope.

Binding names

bindVariable :: Name -> Name -> ScopeM () Source

Bind a variable. The abstract name is supplied as the second argument.

bindName :: Access -> KindOfName -> Name -> QName -> ScopeM () Source

Bind a defined name. Must not shadow anything.

bindModule :: Access -> Name -> ModuleName -> ScopeM () Source

Bind a module name.

bindQModule :: Access -> QName -> ModuleName -> ScopeM () Source

Bind a qualified module name. Adds it to the imports field of the scope.

Module manipulation operations

stripNoNames :: ScopeM () Source

Clear the scope of any no names.

type Ren a = Map a a Source

copyScope :: QName -> ModuleName -> Scope -> ScopeM (Scope, (Ren ModuleName, Ren QName)) Source

Create a new scope with the given name from an old scope. Renames public names in the old scope to match the new name and returns the renamings.

applyImportDirectiveM :: QName -> ImportDirective -> Scope -> ScopeM Scope Source

Apply an import directive and check that all the names mentioned actually exist.

openModule_ :: QName -> ImportDirective -> ScopeM () Source

Open a module.