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

Safe HaskellNone

Agda.Auto.Convert

Documentation

norm :: Normalise t => t -> TCM tSource

type O = (Maybe Int, QName)Source

data TMode Source

Constructors

TMAll 

Instances

Eq TMode 

type MapS a b = (Map a b, [a])Source

initMapS :: (Map k a, [a1])Source

popMapS :: MonadState s m => (s -> (t, [a])) -> ((t, [a]) -> s -> s) -> m (Maybe a)Source

data S Source

Constructors

S 

Fields

sConsts :: MapS QName (TMode, ConstRef O)
 
sMetas :: MapS MetaId (Metavar (Exp O) (RefInfo O), Maybe (MExp O, [MExp O]), [MetaId])
 
sEqs :: MapS Int (Maybe (Bool, MExp O, MExp O))
 
sCurMeta :: Maybe MetaId
 
sMainMeta :: MetaId
 

tomy :: MetaId -> [(Bool, QName)] -> [Type] -> TCM ([ConstRef O], [MExp O], Map MetaId (Metavar (Exp O) (RefInfo O), MExp O, [MExp O], [MetaId]), [(Bool, MExp O, MExp O)], Map QName (TMode, ConstRef O))Source

getConst :: Bool -> QName -> TMode -> TOM (ConstRef O)Source

getEqs :: TCM [(Bool, Term, Term)]Source

tomyClause :: Clause -> StateT S (TCMT IO) (Maybe ([Pat O], MExp O))Source

tomyBody :: Num t => ClauseBodyF Term -> StateT S (TCMT IO) (Maybe (MExp O, t))Source

weaken :: Int -> MExp O -> MExp OSource

fmType :: MetaId -> Type -> BoolSource

fmExp :: MetaId -> Term -> BoolSource

fmExps :: MetaId -> [Arg c Term] -> BoolSource

frommy :: MExp O -> ErrorT String IO TermSource

frommyExp :: MExp O -> ErrorT String IO TermSource

frommyExps :: Nat -> MArgList O -> Term -> ErrorT String IO TermSource

frommyClause :: (CSCtx O, [CSPat O], Maybe (MExp O)) -> ErrorT String IO ClauseSource

freeIn :: Nat -> MExp o -> BoolSource

findClauseDeep :: MetaId -> TCM (Maybe (QName, Clause, Bool))Source

matchType :: Int -> Int -> Type -> Type -> Maybe (Nat, Nat)Source