Team

'BENJAMIN SINGER' printNl !
'Project coordination/Sponsoring' printNl !
'1 -> E-mail' printNl !
n := stdin nextLine asInteger
( n = 1 ) 
       ifTrue: ['benjamin.singer@codemotionworld.com' printNl]

Benni

echo LINDA DUDACY
echo Project coordination/Community outreach
OPTIONS="Email"
select opt in $OPTIONS; do
	if [ "$opt" = "Quit" ]; then
		echo done
		exit
	elif [ "$opt" = "Email" ]; then
		echo linda.dudacy@codemotionworld.com
	else
		clear
		echo bad option
	fi
done

portrait_o


 

body::after {
  content: "NADINE SCHILDHAUER - Press & communications";
  background-color: cornsilk;
  font-family: fantasy;
}
body:hover::after {
  content: "nsc@newthinking.de";
}

 

nadine

 

IDENTIFICATION DIVISION.
       PROGRAM-ID.  Contact-details.

       DATA DIVISION.
       WORKING-STORAGE SECTION.
       01  Selection           PIC 9  VALUE ZEROS.

       PROCEDURE DIVISION.
       Details.
       DISPLAY "PAUL BERSCHICK"
       DISPLAY "social media & communications"
       DISPLAY "1 -> E-mail"
       ACCEPT Selection
       IF Selection = 1 THEN
         DISPLAY "pbe@newthinking.de"
       END-IF
       STOP RUN.

nadine

package main

import "os"
import "fmt"
import "bufio"

func main() {
        fmt.Println("NINA MÜLLER")
        fmt.Println("partner management events")
        r := bufio.NewReader(os.Stdin)
        for {
                i, _, _ := r.ReadLine()
                switch {
                case string(i) == "x":
                        os.Exit(0)
                case string(i) == "mail":
                        fmt.Println("nmu@newthinking.de")
                case true:
                        fmt.Println("?")
                }
        }
}

Benni

module Main where

main = do
	putStrLn "CHRISTEN JANSEN"
	putStrLn "web management"
	command

 

290485_2210876518683_4958255_o(1)

'Theresa Fieseler' printNl !
'volunteer management' printNl !
'1 -> E-mail' printNl !
n := stdin nextLine asInteger
( n = 1 ) 
       ifTrue: ['volunteerberlin@codemotionworld.com' printNl]

Benni

Main Sponsor