{-# LANGUAGE OverloadedStrings #-}

module Funcons.Core.Values.Primitive.BoolBuiltin where

import Funcons.EDSL
import Funcons.Operations hiding (Values, libFromList)

library :: FunconLibrary
library = [(Name, EvalFunction)] -> FunconLibrary
libFromList []

bool_ :: Bool -> Funcons 
bool_ :: Bool -> Funcons
bool_ = Values -> Funcons
FValue (Values -> Funcons) -> (Bool -> Values) -> Bool -> Funcons
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Bool -> Values
forall t. Bool -> Values t
tobool