Skip to content

Commit

Permalink
Merge pull request #4511 from unisonweb/topic/scheme-standalone
Browse files Browse the repository at this point in the history
Partial implementation for native execution/compilation via a standalone executable
  • Loading branch information
dolio authored Dec 14, 2023
2 parents 3d57a2d + 49a7d17 commit 251a2f0
Show file tree
Hide file tree
Showing 14 changed files with 576 additions and 161 deletions.
14 changes: 8 additions & 6 deletions parser-typechecker/src/Unison/Runtime/Decompile.hs
Original file line number Diff line number Diff line change
Expand Up @@ -5,13 +5,14 @@
{-# LANGUAGE ViewPatterns #-}

module Unison.Runtime.Decompile
( decompile
, DecompError (..)
, renderDecompError
) where
( decompile,
DecompResult,
DecompError (..),
renderDecompError,
)
where

import Data.Set (singleton)
import Prelude hiding (lines)
import Unison.ABT (substs)
import Unison.Codebase.Runtime (Error)
import Unison.ConstructorReference (GConstructorReference (..))
Expand Down Expand Up @@ -64,10 +65,11 @@ import Unison.Type
typeLinkRef,
)
import Unison.Util.Bytes qualified as By
import Unison.Util.Pretty (lit, indentN, lines, wrap, syntaxToColor)
import Unison.Util.Pretty (indentN, lines, lit, syntaxToColor, wrap)
import Unison.Util.Text qualified as Text
import Unison.Var (Var)
import Unsafe.Coerce -- for Int -> Double
import Prelude hiding (lines)

con :: (Var v) => Reference -> Word64 -> Term v ()
con rf ct = constructor () (ConstructorReference rf $ fromIntegral ct)
Expand Down
Loading

0 comments on commit 251a2f0

Please sign in to comment.