This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Main where | |
import Prelude | |
import Control.Monad.Eff (Eff) | |
import Control.Monad.Eff.Class | |
import Control.Monad.Aff (launchAff, Aff, makeAff, attempt) | |
import Control.Monad.Aff.Console (CONSOLE, log) | |
import Control.Monad.Eff.Exception (Error, try) | |
import Control.Monad.Except.Trans (ExceptT(..), runExceptT) | |
import Network.HTTP.Affjax as Ajax |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Grammar where | |
import Prelude | |
import Control.Applicative.Free (FreeAp, liftFreeAp, foldFreeAp) | |
import Control.Alt (class Alt, (<|>)) | |
import Control.Alternative (class Alternative) | |
import Control.Monad.Eff (Eff) | |
import Control.Monad.Eff.Console (log, CONSOLE) | |
import Control.Plus (class Plus, empty) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Control.Monad.Aff.AVar.Select | |
( Select | |
, put | |
, take | |
, select | |
) where | |
import Prelude | |
import Control.Monad.Aff (Aff) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
"use strict"; | |
var $foreign = require("./foreign"); | |
var Control_Applicative = require("../Control.Applicative"); | |
var Control_Bind = require("../Control.Bind"); | |
var Control_Monad_Eff = require("../Control.Monad.Eff"); | |
var Control_Monad_Eff_Console = require("../Control.Monad.Eff.Console"); | |
var Control_Monad_Error_Class = require("../Control.Monad.Error.Class"); | |
var Control_Monad_Except = require("../Control.Monad.Except"); | |
var Control_Monad_Except_Trans = require("../Control.Monad.Except.Trans"); | |
var Control_Monad_Free = require("../Control.Monad.Free"); |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
type Callback eff a = Either Error a -> Eff eff Unit | |
type Producer eff a = Tuple a (Callback eff Unit) | |
data Consumer eff a | |
= Reader (Callback eff a) | |
| Taker (Callback eff a) | |
type Queue = NonEmpty Array |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
type Debouncer = | |
{ var :: AVar Unit | |
, timer :: Fiber Unit | |
} | |
type State = | |
{ debouncer :: Maybe Debouncer | |
} | |
debounceTimeout :: Milliseconds -> AVar Unit -> Aff (avar :: AVAR | eff) (Fiber Unit) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Main where | |
import Prelude | |
import Data.Generic.Rep | |
import Type.Proxy | |
import Data.Symbol (SProxy(..), reflectSymbol, class IsSymbol) | |
import Type.Equality | |
import Control.Alternative | |
import Control.Monad.Eff.Console (logShow) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
purs: An internal error occurred during compilation: "Invalid argument to infer: ObjectUpdateNested (PositionedValue (SourceSpan {spanName = \"src/Awake/DeviceGraph/Graph.purs\", spanStart = SourcePos {sourcePosLine = 199, sourcePosColumn = 9}, spanEnd = SourcePos {sourcePosLine = 199, sourcePosColumn = 23}}) [] (Var (SourceSpan {spanName = \"src/Awake/DeviceGraph/Graph.purs\", spanStart = SourcePos {sourcePosLine = 199, sourcePosColumn = 9}, spanEnd = SourcePos {sourcePosLine = 199, sourcePosColumn = 23}}) (Qualified Nothing (Ident \"activePosition\")))) (PathTree (AssocList {runAssocList = [(\"y\",Leaf (PositionedValue (SourceSpan {spanName = \"src/Awake/DeviceGraph/Graph.purs\", spanStart = SourcePos {sourcePosLine = 200, sourcePosColumn = 17}, spanEnd = SourcePos {sourcePosLine = 200, sourcePosColumn = 21}}) [] (Var (SourceSpan {spanName = \"src/Awake/DeviceGraph/Graph.purs\", spanStart = SourcePos {sourcePosLine = 200, sourcePosColumn = 17}, spanEnd = SourcePos {sourcePosLine = 200, sourcePosColumn = 21} |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
data TraverseProp (f :: Type -> Type) k = TraverseProp k | |
instance traverseProp :: | |
( Applicative f | |
, IsSymbol sym | |
, Row.Lacks sym rb | |
, Row.Cons sym b rb rc | |
, Mapping k a (f b) | |
) => | |
FoldingWithIndex |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Deref where | |
import Prelude hiding (map, apply, pure) | |
import Record as Record | |
import Prelude as Prelude | |
import Prim.Row as Row | |
import Data.Symbol (SProxy(..), class IsSymbol) | |
data Deref r1 (r2 :: # Type) (r3 :: # Type) a = Deref ({ | r1 } -> a) |