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 Affjax as AX | |
import Affjax.ResponseFormat as AXRF | |
import Affjax.StatusCode (StatusCode(..)) | |
import CSS (block, display) | |
import Data.Argonaut as Argonaut | |
import Data.Either (Either(..)) |
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.Except (ExceptT(..)) | |
import Control.Monad.Except as Except | |
import Control.Monad.Except as ExceptT | |
import Control.Parallel as Parallel | |
import Control.Parallel (class Parallel) | |
import Data.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
{-# LANGUAGE AllowAmbiguousTypes #-} | |
{-# LANGUAGE BlockArguments #-} | |
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE GADTs #-} | |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE RankNTypes #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
{-# LANGUAGE TypeApplications #-} |
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.Date (Date) | |
import Data.Date as Date | |
import Data.Enum as Enum | |
import Data.Maybe (Maybe(..)) | |
import Data.Maybe as Maybe | |
import Data.String.CodePoints as CodePoints |
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 Effect.Console as Console | |
import TryPureScript (render, withConsole) | |
import Data.Array as Array | |
import Data.List.ZipList (ZipList(..)) | |
zip3 :: Array Int -> Array Int -> Array Int -> Array (Array Int) |
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.Comonad (class Comonad, extend, extract) | |
import Control.Comonad.Store (Store, store, peek, pos) | |
import Control.Comonad.Traced (Traced, runTraced, traced) | |
import Effect (Effect) | |
import Effect.Class.Console (log) | |
import Data.Array ((..), filter, length) |
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.Comonad (class Comonad) | |
import Control.Comonad as Comonad | |
import Control.Extend (class Extend) | |
import Control.Extend as Extend | |
import Data.Array.NonEmpty (NonEmptyArray) | |
import Data.Array.NonEmpty as NE |
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 Effect (Effect) | |
import Effect.Console as Console | |
import TryPureScript (render, withConsole) | |
data SchoolPerson = Teacher | Director | Student String |
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.Alt ((<|>)) | |
import Control.Lazy as Lazy | |
import Data.Either (Either(..)) | |
import Data.Int as Int | |
import Data.Maybe (Maybe(..)) | |
import Effect (Effect) |
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 Affjax as Affjax | |
import Affjax.ResponseFormat as ResponseFormat | |
import Control.Monad.Except (ExceptT(..)) | |
import Control.Monad.Except as Except | |
import Data.Argonaut as Argonaut | |
import Effect (Effect) | |
import Effect.Class as Effect |