Copyright | (c) 2021-2024 Rudy Matela |
---|---|
License | 3-Clause BSD (see the file LICENSE) |
Maintainer | Rudy Matela <rudy@matela.com.br> |
Safe Haskell | Safe-Inferred |
Language | Haskell2010 |
Synopsis
- type Defn = [Bndn]
- type Bndn = (Expr, Expr)
- toDynamicWithDefn :: (Expr -> Expr) -> Int -> Defn -> Expr -> Maybe Dynamic
- devaluate :: Typeable a => (Expr -> Expr) -> Int -> Defn -> Expr -> Maybe a
- deval :: Typeable a => (Expr -> Expr) -> Int -> Defn -> a -> Expr -> a
- devl :: Typeable a => (Expr -> Expr) -> Int -> Defn -> Expr -> a
- devalFast :: Typeable a => (Expr -> Expr) -> Int -> Defn -> a -> Expr -> a
- showDefn :: Defn -> String
- printDefn :: Defn -> IO ()
- defnApparentlyTerminates :: Defn -> Bool
- isCompleteDefn :: Defn -> Bool
- isCompleteBndn :: Bndn -> Bool
- canonicalizeBndn :: Bndn -> Bndn
- canonicalizeBndnLast :: Int -> Bndn -> Bndn
- hasUnbound :: Bndn -> Bool
- noUnbound :: Bndn -> Bool
- isUndefined :: Defn -> Bool
- isDefined :: Defn -> Bool
- isBaseCase :: Bndn -> Bool
- isRecursiveCase :: Bndn -> Bool
- isRecursiveDefn :: Defn -> Bool
- module Conjure.Expr
Documentation
A function definition as a list of top-level case bindings (Bndn
).
Here is an example using the notation from Data.Express.Fixtures:
sumV :: Expr sumV = var "sum" (undefined :: [Int] -> Int) (=-) = (,) infixr 0 =- sumDefn :: Defn sumDefn = [ sum' nil =- zero , sum' (xx -:- xxs) =- xx -+- (sumV :$ xxs) ] where sum' e = sumV :$ e
toDynamicWithDefn :: (Expr -> Expr) -> Int -> Defn -> Expr -> Maybe Dynamic Source #
Evaluates an Expr
to a Dynamic
value
using the given Defn
as definition
when a recursive call is found.
Arguments:
- a function that deeply reencodes an expression (cf.
expr
) - the maximum number of recursive evaluations
- a
Defn
to be used when evaluating the givenExpr
- an
Expr
to be evaluated
This function cannot be used to evaluate a functional value for the given Defn
and can only be used when occurrences of the given Defn
are fully applied.
The function the deeply reencodes an Expr
can be defined using
functionality present in Conjure.Conjurable. Here's a quick-and-dirty version
that is able to reencode Bool
s, Int
s and their lists:
exprExpr :: Expr -> Expr exprExpr = conjureExpress (undefined :: Bool -> [Bool] -> Int -> [Int] -> ())
The maximum number of recursive evaluations counts in two ways:
- the maximum number of entries in the recursive-evaluation memo table;
- the maximum number of terminal values considered (but in this case the
limit is multiplied by the _size_ of the given
Defn
.
These could be divided into two separate parameters but then there would be an extra _dial_ to care about...
devaluate :: Typeable a => (Expr -> Expr) -> Int -> Defn -> Expr -> Maybe a Source #
Evaluates an Expr
expression into Just
a regular Haskell value
using a Defn
definition when it is found.
If there's a type-mismatch, this function returns Nothing
.
This function requires a Expr
-deep-reencoding function
and a limit to the number of recursive evaluations.
(cf. toDynamicWithDefn
, deval
, devl
)
deval :: Typeable a => (Expr -> Expr) -> Int -> Defn -> a -> Expr -> a Source #
Evaluates an Expr
expression into a regular Haskell value
using a Defn
definition when it is found in the given expression.
If there's a type-mismatch, this function return a default value.
This function requires a Expr
-deep-reencoding function
and a limit to the number of recursive evaluations.
(cf. toDynamicWithDefn
, devaluate
, devl')
devl :: Typeable a => (Expr -> Expr) -> Int -> Defn -> Expr -> a Source #
Evaluates an Expr
expression into a regular Haskell value
using a Defn
definition when it is found in the given expression.
If there's a type-mismatch, this raises an error.
This function requires a Expr
-deep-reencoding function
and a limit to the number of recursive evaluations.
(cf. toDynamicWithDefn
, devaluate
, deval')
printDefn :: Defn -> IO () Source #
Pretty-prints a Defn
to the screen.
> printDefn sumDefn sum [] = 0 sum (x:xs) = x + sum xs
defnApparentlyTerminates :: Defn -> Bool Source #
Returns whether the given definition apparentlyTerminates
.
isCompleteDefn :: Defn -> Bool Source #
Returns whether the definition is complete, i.e., whether it does not have any holes in the RHS.
isCompleteBndn :: Bndn -> Bool Source #
Returns whether the binding is complete, i.e., whether it does not have any holes in the RHS.
canonicalizeBndn :: Bndn -> Bndn Source #
hasUnbound :: Bndn -> Bool Source #
Returns whether a binding has undefined variables, i.e., there are variables in the RHS that are not declared in the LHS.
> hasUnbound (xx -:- xxs, xxs) False
> hasUnbound (xx -:- xxs, yys) True
For Defn
s, use isUndefined
.
isUndefined :: Defn -> Bool Source #
Returns whether a Defn
has undefined variables,
i.e.,
there are variables in the RHSs that are not declared in the LHSs.
> isUndefined [(nil, nil), (xx -:- xxs, xxs)] False
> isUndefined [(nil, xxs), (xx -:- xxs, yys)] True
For single Bndn
s, use hasUnbound
.
isBaseCase :: Bndn -> Bool Source #
Returns whether a binding is a base case.
> isBaseCase (ff (xx -:- nil), xx) True
> isBaseCase (ff (xx -:- xxs), ff xxs) False
(cf. isRecursiveCase
)
isRecursiveCase :: Bndn -> Bool Source #
Returns whether a binding is a base case.
> isRecursiveCase (ff (xx -:- nil), xx) False
> isRecursiveCase (ff (xx -:- xxs), ff xxs) True
(cf. isBaseCase
)
isRecursiveDefn :: Defn -> Bool Source #
Returns whether a definition is recursive
module Conjure.Expr