{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.CivicInfo
(
civicInfoService
, CivicInfoAPI
, module Network.Google.Resource.CivicInfo.Divisions.Search
, module Network.Google.Resource.CivicInfo.Elections.ElectionQuery
, module Network.Google.Resource.CivicInfo.Elections.VoterInfoQuery
, module Network.Google.Resource.CivicInfo.Representatives.RepresentativeInfoByAddress
, module Network.Google.Resource.CivicInfo.Representatives.RepresentativeInfoByDivision
, RepresentativeInfoResponseDivisions
, representativeInfoResponseDivisions
, rirdAddtional
, VoterInfoResponse
, voterInfoResponse
, virOtherElections
, virContests
, virState
, virKind
, virDropOffLocations
, virElection
, virNormalizedInput
, virMailOnly
, virSegments
, virEarlyVoteSites
, virPollingLocations
, virPrecinctId
, PollingLocation
, pollingLocation
, plVoterServices
, plLatitude
, plEndDate
, plSources
, plAddress
, plStartDate
, plPollingHours
, plName
, plId
, plNotes
, plLongitude
, RepresentativesRepresentativeInfoByDivisionLevels (..)
, GeographicDivision
, geographicDivision
, gdName
, gdOfficeIndices
, gdAlsoKnownAs
, StreetSegment
, streetSegment
, ssOriginalId
, ssPollinglocationByIds
, ssStartHouseNumber
, ssCataListUniquePrecinctCode
, ssState
, ssContestIds
, ssStateHouseDistrict
, ssNcoaAddress
, ssEarlyVoteSiteByIds
, ssCountyCouncilDistrict
, ssCityCouncilDistrict
, ssGeocodedPoint
, ssEndHouseNumber
, ssSubAdministrativeAreaName
, ssPublished
, ssStartLatE7
, ssZip
, ssSurrogateId
, ssMunicipalDistrict
, ssWardDistrict
, ssVoterGeographicDivisionOcdIds
, ssStreetName
, ssTownshipDistrict
, ssUnitType
, ssCongressionalDistrict
, ssStateSenateDistrict
, ssOddOrEvens
, ssGeographicDivisionOcdIds
, ssBeforeGeocodeId
, ssDataSetId
, ssStartLngE7
, ssCity
, ssWildcard
, ssTargetsmartUniquePrecinctCode
, ssProvenances
, ssSchoolDistrict
, ssMailOnly
, ssId
, ssUnitNumber
, ssAdministrationRegionIds
, ssVanPrecinctCode
, ssJudicialDistrict
, ssPrecinctName
, ssCountyFips
, ssPrecinctOcdId
, Candidate
, candidate
, cEmail
, cPhone
, cPhotoURL
, cChannels
, cCandidateURL
, cOrderOnBallot
, cName
, cParty
, RepresentativesRepresentativeInfoByAddressLevels (..)
, Office
, office
, oDivisionId
, oRoles
, oOfficialIndices
, oSources
, oName
, oLevels
, RepresentativesRepresentativeInfoByDivisionRoles (..)
, StreetSegmentList
, streetSegmentList
, sslSegments
, LivegraphBacktraceRecordInfo
, livegraphBacktraceRecordInfo
, lbriDataSourcePublishMsec
, lbriTopicBuildStartMsec
, lbriIsRecon
, lbriPriority
, lbriShouldMonitorLatency
, lbriRecordId
, lbriProxySentMsec
, lbriExpInfo
, lbriProcess
, lbriTopicBuildFinishMsec
, lbriNumberOfTriples
, lbriProxyReceiveMsec
, lbriVersion
, lbriIsWlmThrottled
, lbriExpId
, lbriSubscriberReceiveMsec
, ElectionsQueryRequest
, electionsQueryRequest
, eqrContextParams
, Channel
, channel
, cId
, cType
, Election
, election
, eOcdDivisionId
, eElectionDay
, eName
, eId
, RepresentativeInfoResponse
, representativeInfoResponse
, rirKind
, rirNormalizedInput
, rirOfficials
, rirDivisions
, rirOffices
, VoterInfoSegmentResult
, voterInfoSegmentResult
, visrResponse
, visrGeneratedMillis
, visrPostalAddress
, visrRequest
, DivisionSearchResult
, divisionSearchResult
, dsrAliases
, dsrName
, dsrOcdId
, DivisionSearchRequest
, divisionSearchRequest
, dsrContextParams
, FieldMetadataProto
, fieldMetadataProto
, fmpInternal
, MessageSet
, messageSet
, msRecordMessageSetExt
, AdministrativeBody
, administrativeBody
, abCorrespondenceAddress
, abAbsenteeVotingInfoURL
, abHoursOfOperation
, abBallotInfoURL
, abPhysicalAddress
, abElectionRegistrationConfirmationURL
, abElectionInfoURL
, abVotingLocationFinderURL
, abElectionOfficials
, abName
, abElectionRulesURL
, abAddressLines
, abVoterServices
, abElectionRegistrationURL
, RepresentativeInfoRequest
, representativeInfoRequest
, rirContextParams
, Contest
, contest
, conReferendumPassageThreshold
, conRoles
, conReferendumURL
, conReferendumEffectOfAbstain
, conReferendumSubtitle
, conNumberVotingFor
, conOffice
, conReferendumConStatement
, conSources
, conReferendumProStatement
, conReferendumBallotResponses
, conNumberElected
, conSpecial
, conReferendumText
, conPrimaryParty
, conId
, conType
, conBallotTitle
, conElectorateSpecifications
, conReferendumBrief
, conDistrict
, conLevel
, conCandidates
, conReferendumTitle
, conBallotPlacement
, DivisionSearchResponse
, divisionSearchResponse
, dsrResults
, dsrKind
, RepresentativeInfoDataDivisions
, representativeInfoDataDivisions
, riddAddtional
, RepresentativesRepresentativeInfoByAddressRoles (..)
, ElectionOfficial
, electionOfficial
, eoFaxNumber
, eoName
, eoOfficePhoneNumber
, eoEmailAddress
, eoTitle
, PointProto
, pointProto
, ppLatE7
, ppLngE7
, ppMetadata
, ppTemporaryData
, RepresentativeInfoData
, representativeInfoData
, ridOfficials
, ridDivisions
, ridOffices
, Source
, source
, sName
, sOfficial
, DivisionRepresentativeInfoRequest
, divisionRepresentativeInfoRequest
, drirContextParams
, ElectoralDistrict
, electoralDistrict
, edKgForeignKey
, edName
, edScope
, edId
, VoterInfoRequest
, voterInfoRequest
, virVoterInfoSegmentResult
, virContextParams
, SimpleAddressType
, simpleAddressType
, satLine2
, satState
, satLine3
, satZip
, satCity
, satLine1
, satLocationName
, InternalSourceSummaryProto
, internalSourceSummaryProto
, isspDataSet
, isspProvider
, LivegraphBacktraceRecordInfoExpInfo
, livegraphBacktraceRecordInfoExpInfo
, lbrieiDeletedIns
, ContextParams
, contextParams
, cpClientProFile
, PostalAddress
, postalAddress
, paAdministrativeAreaName
, paRecipientName
, paLanguageCode
, paSortingCode
, paPremiseName
, paPostalCodeNumberExtension
, paCountryNameCode
, paSubAdministrativeAreaName
, paPostBoxNumber
, paLocalityName
, paIsDisputed
, paThoroughfareNumber
, paDependentLocalityName
, paFirmName
, paCountryName
, paDependentThoroughfareName
, paAddressLines
, paPostalCodeNumber
, paThoroughfareName
, paSubPremiseName
, InternalFieldMetadataProto
, internalFieldMetadataProto
, ifmpSourceSummary
, ifmpIsAuto
, AdministrationRegion
, administrationRegion
, arLocalJurisdiction
, arSources
, arName
, arElectionAdministrationBody
, arId
, Provenance
, provenance
, pTsStreetSegmentId
, pVIPStreetSegmentId
, pCollidedSegmentSource
, pCtclContestUuid
, pDataSetId
, pVIP5StreetSegmentId
, pCtclOfficeUuid
, pVIP5PrecinctId
, pPrecinctSplitId
, pPrecinctId
, ElectionsQueryResponse
, electionsQueryResponse
, eqrKind
, eqrElections
, Official
, official
, offPhotoURL
, offURLs
, offChannels
, offAddress
, offPhones
, offName
, offEmails
, offParty
) where
import Network.Google.CivicInfo.Types
import Network.Google.Prelude
import Network.Google.Resource.CivicInfo.Divisions.Search
import Network.Google.Resource.CivicInfo.Elections.ElectionQuery
import Network.Google.Resource.CivicInfo.Elections.VoterInfoQuery
import Network.Google.Resource.CivicInfo.Representatives.RepresentativeInfoByAddress
import Network.Google.Resource.CivicInfo.Representatives.RepresentativeInfoByDivision
type CivicInfoAPI =
ElectionsVoterInfoQueryResource :<|>
ElectionsElectionQueryResource
:<|> DivisionsSearchResource
:<|>
RepresentativesRepresentativeInfoByDivisionResource
:<|>
RepresentativesRepresentativeInfoByAddressResource