Like this perhaps?
aa = {a, b, c};
pp = Permutations[aa]
res = Table[
Normal[SparseArray[# -> 1 & /@
Table[{j, Position[pp[[k]], aa[[j]]][[1, 1]]}, {j, 1,
Length[aa]}]]], {k, 1, Length[pp]}];
(* find matrix-elements for g[ i ]* g[k] *)
rr[k_] := Module[{},
tt = Table[
Position[res, res[[k]].res[[j]]][[1, 1]], {j, 1, Length[res]}];
mm = Normal[SparseArray[# -> 1 & /@ Transpose[{Range[Length[res]], tt}]]] ]
rr /@ Range[Length[res]];
MatrixForm /@ %