ldap-client/test/Ldap/ClientSpec.hs
2015-03-28 10:29:55 +00:00

22 lines
693 B
Haskell

{-# LANGUAGE OverloadedStrings #-}
module Ldap.ClientSpec (spec) where
import Data.Monoid ((<>))
import Test.Hspec
import Ldap.Client
import qualified Ldap.Client as Ldap
spec :: Spec
spec =
context "Example stolen from the LDAP package tests" $
it "searches the public LDAP server at MIT" $ do
res <- Ldap.with (Plain "scripts.mit.edu") 389 $ \l -> do
res <- Ldap.search l (Dn "ou=People,dc=scripts,dc=mit,dc=edu")
(scope WholeSubtree <> typesOnly True)
(Present (Attr "uid"))
[]
res `shouldSatisfy` (not . null)
res `shouldBe` Right ()