Commit 416afc66 authored by Mael NICOLAS's avatar Mael NICOLAS

remove Actions

parent f4a8737b
......@@ -15,8 +15,8 @@ import Data.Either (Either(..))
import Network.HTTP.Affjax (AJAX, affjax, defaultRequest)
get :: forall eff t2 t31. DecodeJson t31 => String ->
Aff ( console :: CONSOLE, ajax :: AJAX| eff)
get :: forall eff t2 t31. DecodeJson t31 => String ->
Aff (console :: CONSOLE, ajax :: AJAX| eff)
(Either String t31)
get url = do
affResp <- liftAff $ attempt $ affjax defaultRequest
......
module Gargantext.Users.Actions
(module Gargantext.Users.Actions.API)
where
import Gargantext.Users.Actions.API
module Gargantext.Users.Actions.API
where
import Gargantext.Users.Types.Types
import Control.Monad.Aff (Aff, attempt, launchAff)
import Control.Monad.Aff.Class (liftAff)
import Control.Monad.Aff.Console (log)
import Data.Argonaut (decodeJson)
import Data.Either (Either(..))
import Data.HTTP.Method (Method(..))
import Data.Identity (Identity(..))
import Network.HTTP.Affjax (AJAX, affjax, defaultRequest, get)
import Prelude (pure, show, unit, bind, discard, (<<<), ($), (<>))
user userID = launchAff $ do
res <- get "http://localhost:8008/node/452146"
pure res
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment