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
| # I found some good resources but they seem to do a bit too much (maybe from a time when there were more bugs). | |
| # So here's a minimal Gist which worked for me as an install on a new M1 Pro. | |
| # Inspired by https://github.com/malob/nixpkgs I highly recommend looking at malob's repo for a more thorough configuration | |
| # | |
| # Let's get started | |
| # | |
| # Let's install nix (at the time of writing this is version 2.5.1 | |
| curl -L https://nixos.org/nix/install | sh | |
| # I might not have needed to, but I rebooted |
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 Prim.Row (class Nub, class Union) | |
| import React.Basic.DOM as DOM | |
| import React.Basic.DOM.Generated (Props_video) | |
| import React.Basic.Hooks (Component) | |
| import React.Basic.Hooks as React | |
| import Record (merge) |
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.Array as Array | |
| import Data.FingerTree (FingerTree) | |
| import Data.FingerTree as FingerTree | |
| import Data.Lazy as Lazy | |
| import Data.Monoid.Additive (Additive(..)) | |
| import Data.Newtype (class Newtype) |
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 |