{-# LANGUAGE OverloadedStrings #-}

module Funcons.Parser (fct_parse, fvalue_parse) where

import Funcons.GLLParser (fct_parse, fvalue_parse)