Skip to content

Instantly share code, notes, and snippets.

View codedmart's full-sized avatar

Brandon Martin codedmart

View GitHub Profile
-- from purescript-argonaut https://github.com/purescript-contrib/purescript-argonaut-codecs/blob/master/src/Data/Argonaut/Combinators.purs#L34-L35
-- obj .? "foo"
(.?) :: forall a. (DecodeJson a) => JObject -> String -> Either String a
(.?) o s = maybe (Left $ "Expected field " ++ show s) decodeJson (M.lookup s o)
-- I would like to do something like
-- obj `at` ["foo", "bar"]
at :: forall a. (DecodeJson a) => JObject -> Array String -> Either String a
at obj fields = fold (.?) obj (reverse fields)
module Types.AspectRatio where
import Prelude
import Data.Generic
import Data.Argonaut ((~>), (.?), (:=), jsonEmptyObject)
import Data.Argonaut.Encode (EncodeJson, encodeJson)
import Data.Argonaut.Decode (DecodeJson, decodeJson)
module Types.Foo where
import Prelude
import Data.Argonaut ((~>), (:=), (.?), jsonEmptyObject)
import Data.Argonaut.Encode (EncodeJson, encodeJson)
import Data.Argonaut.Decode (DecodeJson, decodeJson)
import Data.Maybe (Maybe(..))
type Foo =
{ foo :: Maybe Number
module Stores.App where
import Prelude
import Data.Generic
import Data.Maybe
-- import Control.Monad.Eff
import Control.Monad.Eff.Console (log)
import Data.Maybe.Unsafe (fromJust)
import Signal (Signal(), foldp, dropRepeats, mergeMany, constant)
var update = function (action) {
return function (state) {
if (action instanceof Update) {
return action.value0;
};
if (action instanceof Alert) {
return state;
};
if (action instanceof DoFoo) {
if (action.value0 instanceof Data_Maybe.Just) {
update :: Action -> AppState -> AppState
update action state = case action of
Update st -> st
Alert alrt -> state
DoFoo foo' -> case decodeMaybe foo' of
Just f -> state { foo = runFoo f }
Nothing -> state
-- DoFoo foo' -> case foo' of
-- Just f -> state { foo = f }
-- Nothing -> state
module Stores.App where
import Prelude
import Data.Generic
import Data.Maybe
-- import Control.Monad.Eff
-- import Control.Monad.Eff.Console (log)
import Data.Maybe.Unsafe (fromJust)
import Signal (Signal(), foldp, dropRepeats, mergeMany, constant)
type Action
= Setup Options
| Loaded Bool
| DesignChange (Maybe Design)
| ColorChange String
| OrientationChange Int
| MaterialColorChange String
| BulkPriceChange Int
| VariantChange String
| SliderChange Float
module Stores.App where
import Prelude
import Data.Maybe
import Control.Monad.Eff
import Control.Monad.Eff.Console (log)
import Signal (foldp, runSignal)
import Signal.Channel (channel, subscribe)
The error is refering to line 4
Unable to parse module:
unexpected "/"
expecting space, "&" or escape code